{-# 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.MGN.UpdateLaunchConfigurationTemplate
-- 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 an existing Launch Configuration Template by ID.
module Amazonka.MGN.UpdateLaunchConfigurationTemplate
  ( -- * Creating a Request
    UpdateLaunchConfigurationTemplate (..),
    newUpdateLaunchConfigurationTemplate,

    -- * Request Lenses
    updateLaunchConfigurationTemplate_associatePublicIpAddress,
    updateLaunchConfigurationTemplate_bootMode,
    updateLaunchConfigurationTemplate_copyPrivateIp,
    updateLaunchConfigurationTemplate_copyTags,
    updateLaunchConfigurationTemplate_enableMapAutoTagging,
    updateLaunchConfigurationTemplate_largeVolumeConf,
    updateLaunchConfigurationTemplate_launchDisposition,
    updateLaunchConfigurationTemplate_licensing,
    updateLaunchConfigurationTemplate_mapAutoTaggingMpeID,
    updateLaunchConfigurationTemplate_postLaunchActions,
    updateLaunchConfigurationTemplate_smallVolumeConf,
    updateLaunchConfigurationTemplate_smallVolumeMaxSize,
    updateLaunchConfigurationTemplate_targetInstanceTypeRightSizingMethod,
    updateLaunchConfigurationTemplate_launchConfigurationTemplateID,

    -- * Destructuring the Response
    LaunchConfigurationTemplate (..),
    newLaunchConfigurationTemplate,

    -- * Response Lenses
    launchConfigurationTemplate_arn,
    launchConfigurationTemplate_associatePublicIpAddress,
    launchConfigurationTemplate_bootMode,
    launchConfigurationTemplate_copyPrivateIp,
    launchConfigurationTemplate_copyTags,
    launchConfigurationTemplate_ec2LaunchTemplateID,
    launchConfigurationTemplate_enableMapAutoTagging,
    launchConfigurationTemplate_largeVolumeConf,
    launchConfigurationTemplate_launchDisposition,
    launchConfigurationTemplate_licensing,
    launchConfigurationTemplate_mapAutoTaggingMpeID,
    launchConfigurationTemplate_postLaunchActions,
    launchConfigurationTemplate_smallVolumeConf,
    launchConfigurationTemplate_smallVolumeMaxSize,
    launchConfigurationTemplate_tags,
    launchConfigurationTemplate_targetInstanceTypeRightSizingMethod,
    launchConfigurationTemplate_launchConfigurationTemplateID,
  )
where

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

-- | /See:/ 'newUpdateLaunchConfigurationTemplate' smart constructor.
data UpdateLaunchConfigurationTemplate = UpdateLaunchConfigurationTemplate'
  { -- | Associate public Ip address.
    UpdateLaunchConfigurationTemplate -> Maybe Bool
associatePublicIpAddress :: Prelude.Maybe Prelude.Bool,
    -- | Launch configuration template boot mode.
    UpdateLaunchConfigurationTemplate -> Maybe BootMode
bootMode :: Prelude.Maybe BootMode,
    -- | Copy private Ip.
    UpdateLaunchConfigurationTemplate -> Maybe Bool
copyPrivateIp :: Prelude.Maybe Prelude.Bool,
    -- | Copy tags.
    UpdateLaunchConfigurationTemplate -> Maybe Bool
copyTags :: Prelude.Maybe Prelude.Bool,
    -- | Enable map auto tagging.
    UpdateLaunchConfigurationTemplate -> Maybe Bool
enableMapAutoTagging :: Prelude.Maybe Prelude.Bool,
    -- | Large volume config.
    UpdateLaunchConfigurationTemplate -> Maybe LaunchTemplateDiskConf
largeVolumeConf :: Prelude.Maybe LaunchTemplateDiskConf,
    -- | Launch disposition.
    UpdateLaunchConfigurationTemplate -> Maybe LaunchDisposition
launchDisposition :: Prelude.Maybe LaunchDisposition,
    UpdateLaunchConfigurationTemplate -> Maybe Licensing
licensing :: Prelude.Maybe Licensing,
    -- | Launch configuration template map auto tagging MPE ID.
    UpdateLaunchConfigurationTemplate -> Maybe Text
mapAutoTaggingMpeID :: Prelude.Maybe Prelude.Text,
    -- | Post Launch Action to execute on the Test or Cutover instance.
    UpdateLaunchConfigurationTemplate -> Maybe PostLaunchActions
postLaunchActions :: Prelude.Maybe PostLaunchActions,
    -- | Small volume config.
    UpdateLaunchConfigurationTemplate -> Maybe LaunchTemplateDiskConf
smallVolumeConf :: Prelude.Maybe LaunchTemplateDiskConf,
    -- | Small volume maximum size.
    UpdateLaunchConfigurationTemplate -> Maybe Natural
smallVolumeMaxSize :: Prelude.Maybe Prelude.Natural,
    -- | Target instance type right-sizing method.
    UpdateLaunchConfigurationTemplate
-> Maybe TargetInstanceTypeRightSizingMethod
targetInstanceTypeRightSizingMethod :: Prelude.Maybe TargetInstanceTypeRightSizingMethod,
    -- | Launch Configuration Template ID.
    UpdateLaunchConfigurationTemplate -> Text
launchConfigurationTemplateID :: Prelude.Text
  }
  deriving (UpdateLaunchConfigurationTemplate
-> UpdateLaunchConfigurationTemplate -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: UpdateLaunchConfigurationTemplate
-> UpdateLaunchConfigurationTemplate -> Bool
$c/= :: UpdateLaunchConfigurationTemplate
-> UpdateLaunchConfigurationTemplate -> Bool
== :: UpdateLaunchConfigurationTemplate
-> UpdateLaunchConfigurationTemplate -> Bool
$c== :: UpdateLaunchConfigurationTemplate
-> UpdateLaunchConfigurationTemplate -> Bool
Prelude.Eq, ReadPrec [UpdateLaunchConfigurationTemplate]
ReadPrec UpdateLaunchConfigurationTemplate
Int -> ReadS UpdateLaunchConfigurationTemplate
ReadS [UpdateLaunchConfigurationTemplate]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [UpdateLaunchConfigurationTemplate]
$creadListPrec :: ReadPrec [UpdateLaunchConfigurationTemplate]
readPrec :: ReadPrec UpdateLaunchConfigurationTemplate
$creadPrec :: ReadPrec UpdateLaunchConfigurationTemplate
readList :: ReadS [UpdateLaunchConfigurationTemplate]
$creadList :: ReadS [UpdateLaunchConfigurationTemplate]
readsPrec :: Int -> ReadS UpdateLaunchConfigurationTemplate
$creadsPrec :: Int -> ReadS UpdateLaunchConfigurationTemplate
Prelude.Read, Int -> UpdateLaunchConfigurationTemplate -> ShowS
[UpdateLaunchConfigurationTemplate] -> ShowS
UpdateLaunchConfigurationTemplate -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [UpdateLaunchConfigurationTemplate] -> ShowS
$cshowList :: [UpdateLaunchConfigurationTemplate] -> ShowS
show :: UpdateLaunchConfigurationTemplate -> String
$cshow :: UpdateLaunchConfigurationTemplate -> String
showsPrec :: Int -> UpdateLaunchConfigurationTemplate -> ShowS
$cshowsPrec :: Int -> UpdateLaunchConfigurationTemplate -> ShowS
Prelude.Show, forall x.
Rep UpdateLaunchConfigurationTemplate x
-> UpdateLaunchConfigurationTemplate
forall x.
UpdateLaunchConfigurationTemplate
-> Rep UpdateLaunchConfigurationTemplate x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep UpdateLaunchConfigurationTemplate x
-> UpdateLaunchConfigurationTemplate
$cfrom :: forall x.
UpdateLaunchConfigurationTemplate
-> Rep UpdateLaunchConfigurationTemplate x
Prelude.Generic)

-- |
-- Create a value of 'UpdateLaunchConfigurationTemplate' 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:
--
-- 'associatePublicIpAddress', 'updateLaunchConfigurationTemplate_associatePublicIpAddress' - Associate public Ip address.
--
-- 'bootMode', 'updateLaunchConfigurationTemplate_bootMode' - Launch configuration template boot mode.
--
-- 'copyPrivateIp', 'updateLaunchConfigurationTemplate_copyPrivateIp' - Copy private Ip.
--
-- 'copyTags', 'updateLaunchConfigurationTemplate_copyTags' - Copy tags.
--
-- 'enableMapAutoTagging', 'updateLaunchConfigurationTemplate_enableMapAutoTagging' - Enable map auto tagging.
--
-- 'largeVolumeConf', 'updateLaunchConfigurationTemplate_largeVolumeConf' - Large volume config.
--
-- 'launchDisposition', 'updateLaunchConfigurationTemplate_launchDisposition' - Launch disposition.
--
-- 'licensing', 'updateLaunchConfigurationTemplate_licensing' - Undocumented member.
--
-- 'mapAutoTaggingMpeID', 'updateLaunchConfigurationTemplate_mapAutoTaggingMpeID' - Launch configuration template map auto tagging MPE ID.
--
-- 'postLaunchActions', 'updateLaunchConfigurationTemplate_postLaunchActions' - Post Launch Action to execute on the Test or Cutover instance.
--
-- 'smallVolumeConf', 'updateLaunchConfigurationTemplate_smallVolumeConf' - Small volume config.
--
-- 'smallVolumeMaxSize', 'updateLaunchConfigurationTemplate_smallVolumeMaxSize' - Small volume maximum size.
--
-- 'targetInstanceTypeRightSizingMethod', 'updateLaunchConfigurationTemplate_targetInstanceTypeRightSizingMethod' - Target instance type right-sizing method.
--
-- 'launchConfigurationTemplateID', 'updateLaunchConfigurationTemplate_launchConfigurationTemplateID' - Launch Configuration Template ID.
newUpdateLaunchConfigurationTemplate ::
  -- | 'launchConfigurationTemplateID'
  Prelude.Text ->
  UpdateLaunchConfigurationTemplate
newUpdateLaunchConfigurationTemplate :: Text -> UpdateLaunchConfigurationTemplate
newUpdateLaunchConfigurationTemplate
  Text
pLaunchConfigurationTemplateID_ =
    UpdateLaunchConfigurationTemplate'
      { $sel:associatePublicIpAddress:UpdateLaunchConfigurationTemplate' :: Maybe Bool
associatePublicIpAddress =
          forall a. Maybe a
Prelude.Nothing,
        $sel:bootMode:UpdateLaunchConfigurationTemplate' :: Maybe BootMode
bootMode = forall a. Maybe a
Prelude.Nothing,
        $sel:copyPrivateIp:UpdateLaunchConfigurationTemplate' :: Maybe Bool
copyPrivateIp = forall a. Maybe a
Prelude.Nothing,
        $sel:copyTags:UpdateLaunchConfigurationTemplate' :: Maybe Bool
copyTags = forall a. Maybe a
Prelude.Nothing,
        $sel:enableMapAutoTagging:UpdateLaunchConfigurationTemplate' :: Maybe Bool
enableMapAutoTagging = forall a. Maybe a
Prelude.Nothing,
        $sel:largeVolumeConf:UpdateLaunchConfigurationTemplate' :: Maybe LaunchTemplateDiskConf
largeVolumeConf = forall a. Maybe a
Prelude.Nothing,
        $sel:launchDisposition:UpdateLaunchConfigurationTemplate' :: Maybe LaunchDisposition
launchDisposition = forall a. Maybe a
Prelude.Nothing,
        $sel:licensing:UpdateLaunchConfigurationTemplate' :: Maybe Licensing
licensing = forall a. Maybe a
Prelude.Nothing,
        $sel:mapAutoTaggingMpeID:UpdateLaunchConfigurationTemplate' :: Maybe Text
mapAutoTaggingMpeID = forall a. Maybe a
Prelude.Nothing,
        $sel:postLaunchActions:UpdateLaunchConfigurationTemplate' :: Maybe PostLaunchActions
postLaunchActions = forall a. Maybe a
Prelude.Nothing,
        $sel:smallVolumeConf:UpdateLaunchConfigurationTemplate' :: Maybe LaunchTemplateDiskConf
smallVolumeConf = forall a. Maybe a
Prelude.Nothing,
        $sel:smallVolumeMaxSize:UpdateLaunchConfigurationTemplate' :: Maybe Natural
smallVolumeMaxSize = forall a. Maybe a
Prelude.Nothing,
        $sel:targetInstanceTypeRightSizingMethod:UpdateLaunchConfigurationTemplate' :: Maybe TargetInstanceTypeRightSizingMethod
targetInstanceTypeRightSizingMethod =
          forall a. Maybe a
Prelude.Nothing,
        $sel:launchConfigurationTemplateID:UpdateLaunchConfigurationTemplate' :: Text
launchConfigurationTemplateID =
          Text
pLaunchConfigurationTemplateID_
      }

-- | Associate public Ip address.
updateLaunchConfigurationTemplate_associatePublicIpAddress :: Lens.Lens' UpdateLaunchConfigurationTemplate (Prelude.Maybe Prelude.Bool)
updateLaunchConfigurationTemplate_associatePublicIpAddress :: Lens' UpdateLaunchConfigurationTemplate (Maybe Bool)
updateLaunchConfigurationTemplate_associatePublicIpAddress = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateLaunchConfigurationTemplate' {Maybe Bool
associatePublicIpAddress :: Maybe Bool
$sel:associatePublicIpAddress:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe Bool
associatePublicIpAddress} -> Maybe Bool
associatePublicIpAddress) (\s :: UpdateLaunchConfigurationTemplate
s@UpdateLaunchConfigurationTemplate' {} Maybe Bool
a -> UpdateLaunchConfigurationTemplate
s {$sel:associatePublicIpAddress:UpdateLaunchConfigurationTemplate' :: Maybe Bool
associatePublicIpAddress = Maybe Bool
a} :: UpdateLaunchConfigurationTemplate)

-- | Launch configuration template boot mode.
updateLaunchConfigurationTemplate_bootMode :: Lens.Lens' UpdateLaunchConfigurationTemplate (Prelude.Maybe BootMode)
updateLaunchConfigurationTemplate_bootMode :: Lens' UpdateLaunchConfigurationTemplate (Maybe BootMode)
updateLaunchConfigurationTemplate_bootMode = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateLaunchConfigurationTemplate' {Maybe BootMode
bootMode :: Maybe BootMode
$sel:bootMode:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe BootMode
bootMode} -> Maybe BootMode
bootMode) (\s :: UpdateLaunchConfigurationTemplate
s@UpdateLaunchConfigurationTemplate' {} Maybe BootMode
a -> UpdateLaunchConfigurationTemplate
s {$sel:bootMode:UpdateLaunchConfigurationTemplate' :: Maybe BootMode
bootMode = Maybe BootMode
a} :: UpdateLaunchConfigurationTemplate)

-- | Copy private Ip.
updateLaunchConfigurationTemplate_copyPrivateIp :: Lens.Lens' UpdateLaunchConfigurationTemplate (Prelude.Maybe Prelude.Bool)
updateLaunchConfigurationTemplate_copyPrivateIp :: Lens' UpdateLaunchConfigurationTemplate (Maybe Bool)
updateLaunchConfigurationTemplate_copyPrivateIp = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateLaunchConfigurationTemplate' {Maybe Bool
copyPrivateIp :: Maybe Bool
$sel:copyPrivateIp:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe Bool
copyPrivateIp} -> Maybe Bool
copyPrivateIp) (\s :: UpdateLaunchConfigurationTemplate
s@UpdateLaunchConfigurationTemplate' {} Maybe Bool
a -> UpdateLaunchConfigurationTemplate
s {$sel:copyPrivateIp:UpdateLaunchConfigurationTemplate' :: Maybe Bool
copyPrivateIp = Maybe Bool
a} :: UpdateLaunchConfigurationTemplate)

-- | Copy tags.
updateLaunchConfigurationTemplate_copyTags :: Lens.Lens' UpdateLaunchConfigurationTemplate (Prelude.Maybe Prelude.Bool)
updateLaunchConfigurationTemplate_copyTags :: Lens' UpdateLaunchConfigurationTemplate (Maybe Bool)
updateLaunchConfigurationTemplate_copyTags = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateLaunchConfigurationTemplate' {Maybe Bool
copyTags :: Maybe Bool
$sel:copyTags:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe Bool
copyTags} -> Maybe Bool
copyTags) (\s :: UpdateLaunchConfigurationTemplate
s@UpdateLaunchConfigurationTemplate' {} Maybe Bool
a -> UpdateLaunchConfigurationTemplate
s {$sel:copyTags:UpdateLaunchConfigurationTemplate' :: Maybe Bool
copyTags = Maybe Bool
a} :: UpdateLaunchConfigurationTemplate)

-- | Enable map auto tagging.
updateLaunchConfigurationTemplate_enableMapAutoTagging :: Lens.Lens' UpdateLaunchConfigurationTemplate (Prelude.Maybe Prelude.Bool)
updateLaunchConfigurationTemplate_enableMapAutoTagging :: Lens' UpdateLaunchConfigurationTemplate (Maybe Bool)
updateLaunchConfigurationTemplate_enableMapAutoTagging = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateLaunchConfigurationTemplate' {Maybe Bool
enableMapAutoTagging :: Maybe Bool
$sel:enableMapAutoTagging:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe Bool
enableMapAutoTagging} -> Maybe Bool
enableMapAutoTagging) (\s :: UpdateLaunchConfigurationTemplate
s@UpdateLaunchConfigurationTemplate' {} Maybe Bool
a -> UpdateLaunchConfigurationTemplate
s {$sel:enableMapAutoTagging:UpdateLaunchConfigurationTemplate' :: Maybe Bool
enableMapAutoTagging = Maybe Bool
a} :: UpdateLaunchConfigurationTemplate)

-- | Large volume config.
updateLaunchConfigurationTemplate_largeVolumeConf :: Lens.Lens' UpdateLaunchConfigurationTemplate (Prelude.Maybe LaunchTemplateDiskConf)
updateLaunchConfigurationTemplate_largeVolumeConf :: Lens'
  UpdateLaunchConfigurationTemplate (Maybe LaunchTemplateDiskConf)
updateLaunchConfigurationTemplate_largeVolumeConf = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateLaunchConfigurationTemplate' {Maybe LaunchTemplateDiskConf
largeVolumeConf :: Maybe LaunchTemplateDiskConf
$sel:largeVolumeConf:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe LaunchTemplateDiskConf
largeVolumeConf} -> Maybe LaunchTemplateDiskConf
largeVolumeConf) (\s :: UpdateLaunchConfigurationTemplate
s@UpdateLaunchConfigurationTemplate' {} Maybe LaunchTemplateDiskConf
a -> UpdateLaunchConfigurationTemplate
s {$sel:largeVolumeConf:UpdateLaunchConfigurationTemplate' :: Maybe LaunchTemplateDiskConf
largeVolumeConf = Maybe LaunchTemplateDiskConf
a} :: UpdateLaunchConfigurationTemplate)

-- | Launch disposition.
updateLaunchConfigurationTemplate_launchDisposition :: Lens.Lens' UpdateLaunchConfigurationTemplate (Prelude.Maybe LaunchDisposition)
updateLaunchConfigurationTemplate_launchDisposition :: Lens' UpdateLaunchConfigurationTemplate (Maybe LaunchDisposition)
updateLaunchConfigurationTemplate_launchDisposition = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateLaunchConfigurationTemplate' {Maybe LaunchDisposition
launchDisposition :: Maybe LaunchDisposition
$sel:launchDisposition:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe LaunchDisposition
launchDisposition} -> Maybe LaunchDisposition
launchDisposition) (\s :: UpdateLaunchConfigurationTemplate
s@UpdateLaunchConfigurationTemplate' {} Maybe LaunchDisposition
a -> UpdateLaunchConfigurationTemplate
s {$sel:launchDisposition:UpdateLaunchConfigurationTemplate' :: Maybe LaunchDisposition
launchDisposition = Maybe LaunchDisposition
a} :: UpdateLaunchConfigurationTemplate)

-- | Undocumented member.
updateLaunchConfigurationTemplate_licensing :: Lens.Lens' UpdateLaunchConfigurationTemplate (Prelude.Maybe Licensing)
updateLaunchConfigurationTemplate_licensing :: Lens' UpdateLaunchConfigurationTemplate (Maybe Licensing)
updateLaunchConfigurationTemplate_licensing = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateLaunchConfigurationTemplate' {Maybe Licensing
licensing :: Maybe Licensing
$sel:licensing:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe Licensing
licensing} -> Maybe Licensing
licensing) (\s :: UpdateLaunchConfigurationTemplate
s@UpdateLaunchConfigurationTemplate' {} Maybe Licensing
a -> UpdateLaunchConfigurationTemplate
s {$sel:licensing:UpdateLaunchConfigurationTemplate' :: Maybe Licensing
licensing = Maybe Licensing
a} :: UpdateLaunchConfigurationTemplate)

-- | Launch configuration template map auto tagging MPE ID.
updateLaunchConfigurationTemplate_mapAutoTaggingMpeID :: Lens.Lens' UpdateLaunchConfigurationTemplate (Prelude.Maybe Prelude.Text)
updateLaunchConfigurationTemplate_mapAutoTaggingMpeID :: Lens' UpdateLaunchConfigurationTemplate (Maybe Text)
updateLaunchConfigurationTemplate_mapAutoTaggingMpeID = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateLaunchConfigurationTemplate' {Maybe Text
mapAutoTaggingMpeID :: Maybe Text
$sel:mapAutoTaggingMpeID:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe Text
mapAutoTaggingMpeID} -> Maybe Text
mapAutoTaggingMpeID) (\s :: UpdateLaunchConfigurationTemplate
s@UpdateLaunchConfigurationTemplate' {} Maybe Text
a -> UpdateLaunchConfigurationTemplate
s {$sel:mapAutoTaggingMpeID:UpdateLaunchConfigurationTemplate' :: Maybe Text
mapAutoTaggingMpeID = Maybe Text
a} :: UpdateLaunchConfigurationTemplate)

-- | Post Launch Action to execute on the Test or Cutover instance.
updateLaunchConfigurationTemplate_postLaunchActions :: Lens.Lens' UpdateLaunchConfigurationTemplate (Prelude.Maybe PostLaunchActions)
updateLaunchConfigurationTemplate_postLaunchActions :: Lens' UpdateLaunchConfigurationTemplate (Maybe PostLaunchActions)
updateLaunchConfigurationTemplate_postLaunchActions = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateLaunchConfigurationTemplate' {Maybe PostLaunchActions
postLaunchActions :: Maybe PostLaunchActions
$sel:postLaunchActions:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe PostLaunchActions
postLaunchActions} -> Maybe PostLaunchActions
postLaunchActions) (\s :: UpdateLaunchConfigurationTemplate
s@UpdateLaunchConfigurationTemplate' {} Maybe PostLaunchActions
a -> UpdateLaunchConfigurationTemplate
s {$sel:postLaunchActions:UpdateLaunchConfigurationTemplate' :: Maybe PostLaunchActions
postLaunchActions = Maybe PostLaunchActions
a} :: UpdateLaunchConfigurationTemplate)

-- | Small volume config.
updateLaunchConfigurationTemplate_smallVolumeConf :: Lens.Lens' UpdateLaunchConfigurationTemplate (Prelude.Maybe LaunchTemplateDiskConf)
updateLaunchConfigurationTemplate_smallVolumeConf :: Lens'
  UpdateLaunchConfigurationTemplate (Maybe LaunchTemplateDiskConf)
updateLaunchConfigurationTemplate_smallVolumeConf = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateLaunchConfigurationTemplate' {Maybe LaunchTemplateDiskConf
smallVolumeConf :: Maybe LaunchTemplateDiskConf
$sel:smallVolumeConf:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe LaunchTemplateDiskConf
smallVolumeConf} -> Maybe LaunchTemplateDiskConf
smallVolumeConf) (\s :: UpdateLaunchConfigurationTemplate
s@UpdateLaunchConfigurationTemplate' {} Maybe LaunchTemplateDiskConf
a -> UpdateLaunchConfigurationTemplate
s {$sel:smallVolumeConf:UpdateLaunchConfigurationTemplate' :: Maybe LaunchTemplateDiskConf
smallVolumeConf = Maybe LaunchTemplateDiskConf
a} :: UpdateLaunchConfigurationTemplate)

-- | Small volume maximum size.
updateLaunchConfigurationTemplate_smallVolumeMaxSize :: Lens.Lens' UpdateLaunchConfigurationTemplate (Prelude.Maybe Prelude.Natural)
updateLaunchConfigurationTemplate_smallVolumeMaxSize :: Lens' UpdateLaunchConfigurationTemplate (Maybe Natural)
updateLaunchConfigurationTemplate_smallVolumeMaxSize = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateLaunchConfigurationTemplate' {Maybe Natural
smallVolumeMaxSize :: Maybe Natural
$sel:smallVolumeMaxSize:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe Natural
smallVolumeMaxSize} -> Maybe Natural
smallVolumeMaxSize) (\s :: UpdateLaunchConfigurationTemplate
s@UpdateLaunchConfigurationTemplate' {} Maybe Natural
a -> UpdateLaunchConfigurationTemplate
s {$sel:smallVolumeMaxSize:UpdateLaunchConfigurationTemplate' :: Maybe Natural
smallVolumeMaxSize = Maybe Natural
a} :: UpdateLaunchConfigurationTemplate)

-- | Target instance type right-sizing method.
updateLaunchConfigurationTemplate_targetInstanceTypeRightSizingMethod :: Lens.Lens' UpdateLaunchConfigurationTemplate (Prelude.Maybe TargetInstanceTypeRightSizingMethod)
updateLaunchConfigurationTemplate_targetInstanceTypeRightSizingMethod :: Lens'
  UpdateLaunchConfigurationTemplate
  (Maybe TargetInstanceTypeRightSizingMethod)
updateLaunchConfigurationTemplate_targetInstanceTypeRightSizingMethod = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateLaunchConfigurationTemplate' {Maybe TargetInstanceTypeRightSizingMethod
targetInstanceTypeRightSizingMethod :: Maybe TargetInstanceTypeRightSizingMethod
$sel:targetInstanceTypeRightSizingMethod:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate
-> Maybe TargetInstanceTypeRightSizingMethod
targetInstanceTypeRightSizingMethod} -> Maybe TargetInstanceTypeRightSizingMethod
targetInstanceTypeRightSizingMethod) (\s :: UpdateLaunchConfigurationTemplate
s@UpdateLaunchConfigurationTemplate' {} Maybe TargetInstanceTypeRightSizingMethod
a -> UpdateLaunchConfigurationTemplate
s {$sel:targetInstanceTypeRightSizingMethod:UpdateLaunchConfigurationTemplate' :: Maybe TargetInstanceTypeRightSizingMethod
targetInstanceTypeRightSizingMethod = Maybe TargetInstanceTypeRightSizingMethod
a} :: UpdateLaunchConfigurationTemplate)

-- | Launch Configuration Template ID.
updateLaunchConfigurationTemplate_launchConfigurationTemplateID :: Lens.Lens' UpdateLaunchConfigurationTemplate Prelude.Text
updateLaunchConfigurationTemplate_launchConfigurationTemplateID :: Lens' UpdateLaunchConfigurationTemplate Text
updateLaunchConfigurationTemplate_launchConfigurationTemplateID = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\UpdateLaunchConfigurationTemplate' {Text
launchConfigurationTemplateID :: Text
$sel:launchConfigurationTemplateID:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Text
launchConfigurationTemplateID} -> Text
launchConfigurationTemplateID) (\s :: UpdateLaunchConfigurationTemplate
s@UpdateLaunchConfigurationTemplate' {} Text
a -> UpdateLaunchConfigurationTemplate
s {$sel:launchConfigurationTemplateID:UpdateLaunchConfigurationTemplate' :: Text
launchConfigurationTemplateID = Text
a} :: UpdateLaunchConfigurationTemplate)

instance
  Core.AWSRequest
    UpdateLaunchConfigurationTemplate
  where
  type
    AWSResponse UpdateLaunchConfigurationTemplate =
      LaunchConfigurationTemplate
  request :: (Service -> Service)
-> UpdateLaunchConfigurationTemplate
-> Request UpdateLaunchConfigurationTemplate
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 UpdateLaunchConfigurationTemplate
-> ClientResponse ClientBody
-> m (Either
        Error
        (ClientResponse (AWSResponse UpdateLaunchConfigurationTemplate)))
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 -> forall a. FromJSON a => Object -> Either String a
Data.eitherParseJSON Object
x)

instance
  Prelude.Hashable
    UpdateLaunchConfigurationTemplate
  where
  hashWithSalt :: Int -> UpdateLaunchConfigurationTemplate -> Int
hashWithSalt
    Int
_salt
    UpdateLaunchConfigurationTemplate' {Maybe Bool
Maybe Natural
Maybe Text
Maybe BootMode
Maybe LaunchDisposition
Maybe Licensing
Maybe PostLaunchActions
Maybe TargetInstanceTypeRightSizingMethod
Maybe LaunchTemplateDiskConf
Text
launchConfigurationTemplateID :: Text
targetInstanceTypeRightSizingMethod :: Maybe TargetInstanceTypeRightSizingMethod
smallVolumeMaxSize :: Maybe Natural
smallVolumeConf :: Maybe LaunchTemplateDiskConf
postLaunchActions :: Maybe PostLaunchActions
mapAutoTaggingMpeID :: Maybe Text
licensing :: Maybe Licensing
launchDisposition :: Maybe LaunchDisposition
largeVolumeConf :: Maybe LaunchTemplateDiskConf
enableMapAutoTagging :: Maybe Bool
copyTags :: Maybe Bool
copyPrivateIp :: Maybe Bool
bootMode :: Maybe BootMode
associatePublicIpAddress :: Maybe Bool
$sel:launchConfigurationTemplateID:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Text
$sel:targetInstanceTypeRightSizingMethod:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate
-> Maybe TargetInstanceTypeRightSizingMethod
$sel:smallVolumeMaxSize:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe Natural
$sel:smallVolumeConf:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe LaunchTemplateDiskConf
$sel:postLaunchActions:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe PostLaunchActions
$sel:mapAutoTaggingMpeID:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe Text
$sel:licensing:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe Licensing
$sel:launchDisposition:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe LaunchDisposition
$sel:largeVolumeConf:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe LaunchTemplateDiskConf
$sel:enableMapAutoTagging:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe Bool
$sel:copyTags:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe Bool
$sel:copyPrivateIp:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe Bool
$sel:bootMode:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe BootMode
$sel:associatePublicIpAddress:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe Bool
..} =
      Int
_salt
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Bool
associatePublicIpAddress
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe BootMode
bootMode
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Bool
copyPrivateIp
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Bool
copyTags
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Bool
enableMapAutoTagging
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe LaunchTemplateDiskConf
largeVolumeConf
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe LaunchDisposition
launchDisposition
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Licensing
licensing
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
mapAutoTaggingMpeID
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe PostLaunchActions
postLaunchActions
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe LaunchTemplateDiskConf
smallVolumeConf
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
smallVolumeMaxSize
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe TargetInstanceTypeRightSizingMethod
targetInstanceTypeRightSizingMethod
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
launchConfigurationTemplateID

instance
  Prelude.NFData
    UpdateLaunchConfigurationTemplate
  where
  rnf :: UpdateLaunchConfigurationTemplate -> ()
rnf UpdateLaunchConfigurationTemplate' {Maybe Bool
Maybe Natural
Maybe Text
Maybe BootMode
Maybe LaunchDisposition
Maybe Licensing
Maybe PostLaunchActions
Maybe TargetInstanceTypeRightSizingMethod
Maybe LaunchTemplateDiskConf
Text
launchConfigurationTemplateID :: Text
targetInstanceTypeRightSizingMethod :: Maybe TargetInstanceTypeRightSizingMethod
smallVolumeMaxSize :: Maybe Natural
smallVolumeConf :: Maybe LaunchTemplateDiskConf
postLaunchActions :: Maybe PostLaunchActions
mapAutoTaggingMpeID :: Maybe Text
licensing :: Maybe Licensing
launchDisposition :: Maybe LaunchDisposition
largeVolumeConf :: Maybe LaunchTemplateDiskConf
enableMapAutoTagging :: Maybe Bool
copyTags :: Maybe Bool
copyPrivateIp :: Maybe Bool
bootMode :: Maybe BootMode
associatePublicIpAddress :: Maybe Bool
$sel:launchConfigurationTemplateID:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Text
$sel:targetInstanceTypeRightSizingMethod:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate
-> Maybe TargetInstanceTypeRightSizingMethod
$sel:smallVolumeMaxSize:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe Natural
$sel:smallVolumeConf:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe LaunchTemplateDiskConf
$sel:postLaunchActions:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe PostLaunchActions
$sel:mapAutoTaggingMpeID:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe Text
$sel:licensing:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe Licensing
$sel:launchDisposition:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe LaunchDisposition
$sel:largeVolumeConf:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe LaunchTemplateDiskConf
$sel:enableMapAutoTagging:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe Bool
$sel:copyTags:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe Bool
$sel:copyPrivateIp:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe Bool
$sel:bootMode:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe BootMode
$sel:associatePublicIpAddress:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe Bool
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
associatePublicIpAddress
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe BootMode
bootMode
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
copyPrivateIp
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
copyTags
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
enableMapAutoTagging
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe LaunchTemplateDiskConf
largeVolumeConf
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe LaunchDisposition
launchDisposition
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Licensing
licensing
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
mapAutoTaggingMpeID
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe PostLaunchActions
postLaunchActions
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe LaunchTemplateDiskConf
smallVolumeConf
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
smallVolumeMaxSize
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf
        Maybe TargetInstanceTypeRightSizingMethod
targetInstanceTypeRightSizingMethod
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
launchConfigurationTemplateID

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

instance
  Data.ToJSON
    UpdateLaunchConfigurationTemplate
  where
  toJSON :: UpdateLaunchConfigurationTemplate -> Value
toJSON UpdateLaunchConfigurationTemplate' {Maybe Bool
Maybe Natural
Maybe Text
Maybe BootMode
Maybe LaunchDisposition
Maybe Licensing
Maybe PostLaunchActions
Maybe TargetInstanceTypeRightSizingMethod
Maybe LaunchTemplateDiskConf
Text
launchConfigurationTemplateID :: Text
targetInstanceTypeRightSizingMethod :: Maybe TargetInstanceTypeRightSizingMethod
smallVolumeMaxSize :: Maybe Natural
smallVolumeConf :: Maybe LaunchTemplateDiskConf
postLaunchActions :: Maybe PostLaunchActions
mapAutoTaggingMpeID :: Maybe Text
licensing :: Maybe Licensing
launchDisposition :: Maybe LaunchDisposition
largeVolumeConf :: Maybe LaunchTemplateDiskConf
enableMapAutoTagging :: Maybe Bool
copyTags :: Maybe Bool
copyPrivateIp :: Maybe Bool
bootMode :: Maybe BootMode
associatePublicIpAddress :: Maybe Bool
$sel:launchConfigurationTemplateID:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Text
$sel:targetInstanceTypeRightSizingMethod:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate
-> Maybe TargetInstanceTypeRightSizingMethod
$sel:smallVolumeMaxSize:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe Natural
$sel:smallVolumeConf:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe LaunchTemplateDiskConf
$sel:postLaunchActions:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe PostLaunchActions
$sel:mapAutoTaggingMpeID:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe Text
$sel:licensing:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe Licensing
$sel:launchDisposition:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe LaunchDisposition
$sel:largeVolumeConf:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe LaunchTemplateDiskConf
$sel:enableMapAutoTagging:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe Bool
$sel:copyTags:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe Bool
$sel:copyPrivateIp:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe Bool
$sel:bootMode:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe BootMode
$sel:associatePublicIpAddress:UpdateLaunchConfigurationTemplate' :: UpdateLaunchConfigurationTemplate -> Maybe Bool
..} =
    [Pair] -> Value
Data.object
      ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
          [ (Key
"associatePublicIpAddress" 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
associatePublicIpAddress,
            (Key
"bootMode" 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 BootMode
bootMode,
            (Key
"copyPrivateIp" 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
copyPrivateIp,
            (Key
"copyTags" 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
copyTags,
            (Key
"enableMapAutoTagging" 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
enableMapAutoTagging,
            (Key
"largeVolumeConf" 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 LaunchTemplateDiskConf
largeVolumeConf,
            (Key
"launchDisposition" 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 LaunchDisposition
launchDisposition,
            (Key
"licensing" 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 Licensing
licensing,
            (Key
"mapAutoTaggingMpeID" 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
mapAutoTaggingMpeID,
            (Key
"postLaunchActions" 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 PostLaunchActions
postLaunchActions,
            (Key
"smallVolumeConf" 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 LaunchTemplateDiskConf
smallVolumeConf,
            (Key
"smallVolumeMaxSize" 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 Natural
smallVolumeMaxSize,
            (Key
"targetInstanceTypeRightSizingMethod" 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 TargetInstanceTypeRightSizingMethod
targetInstanceTypeRightSizingMethod,
            forall a. a -> Maybe a
Prelude.Just
              ( Key
"launchConfigurationTemplateID"
                  forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..= Text
launchConfigurationTemplateID
              )
          ]
      )

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

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