{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE DuplicateRecordFields #-}
{-# LANGUAGE NamedFieldPuns #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE StrictData #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
{-# OPTIONS_GHC -fno-warn-unused-matches #-}

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

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

import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import Amazonka.EC2.Internal
import Amazonka.EC2.Types.BlockDeviceMapping
import Amazonka.EC2.Types.IamInstanceProfileSpecification
import Amazonka.EC2.Types.InstanceNetworkInterfaceSpecification
import Amazonka.EC2.Types.InstanceType
import Amazonka.EC2.Types.RunInstancesMonitoringEnabled
import Amazonka.EC2.Types.SpotPlacement
import qualified Amazonka.Prelude as Prelude

-- | Describes the launch specification for an instance.
--
-- /See:/ 'newRequestSpotLaunchSpecification' smart constructor.
data RequestSpotLaunchSpecification = RequestSpotLaunchSpecification'
  { -- | Deprecated.
    RequestSpotLaunchSpecification -> Maybe Text
addressingType :: Prelude.Maybe Prelude.Text,
    -- | One or more block device mapping entries. You can\'t specify both a
    -- snapshot ID and an encryption value. This is because only blank volumes
    -- can be encrypted on creation. If a snapshot is the basis for a volume,
    -- it is not blank and its encryption status is used for the volume
    -- encryption status.
    RequestSpotLaunchSpecification -> Maybe [BlockDeviceMapping]
blockDeviceMappings :: Prelude.Maybe [BlockDeviceMapping],
    -- | Indicates whether the instance is optimized for EBS I\/O. This
    -- optimization provides dedicated throughput to Amazon EBS and an
    -- optimized configuration stack to provide optimal EBS I\/O performance.
    -- This optimization isn\'t available with all instance types. Additional
    -- usage charges apply when using an EBS Optimized instance.
    --
    -- Default: @false@
    RequestSpotLaunchSpecification -> Maybe Bool
ebsOptimized :: Prelude.Maybe Prelude.Bool,
    -- | The IAM instance profile.
    RequestSpotLaunchSpecification
-> Maybe IamInstanceProfileSpecification
iamInstanceProfile :: Prelude.Maybe IamInstanceProfileSpecification,
    -- | The ID of the AMI.
    RequestSpotLaunchSpecification -> Maybe Text
imageId :: Prelude.Maybe Prelude.Text,
    -- | The instance type. Only one instance type can be specified.
    RequestSpotLaunchSpecification -> Maybe InstanceType
instanceType :: Prelude.Maybe InstanceType,
    -- | The ID of the kernel.
    RequestSpotLaunchSpecification -> Maybe Text
kernelId :: Prelude.Maybe Prelude.Text,
    -- | The name of the key pair.
    RequestSpotLaunchSpecification -> Maybe Text
keyName :: Prelude.Maybe Prelude.Text,
    -- | Indicates whether basic or detailed monitoring is enabled for the
    -- instance.
    --
    -- Default: Disabled
    RequestSpotLaunchSpecification
-> Maybe RunInstancesMonitoringEnabled
monitoring :: Prelude.Maybe RunInstancesMonitoringEnabled,
    -- | One or more network interfaces. If you specify a network interface, you
    -- must specify subnet IDs and security group IDs using the network
    -- interface.
    RequestSpotLaunchSpecification
-> Maybe [InstanceNetworkInterfaceSpecification]
networkInterfaces :: Prelude.Maybe [InstanceNetworkInterfaceSpecification],
    -- | The placement information for the instance.
    RequestSpotLaunchSpecification -> Maybe SpotPlacement
placement :: Prelude.Maybe SpotPlacement,
    -- | The ID of the RAM disk.
    RequestSpotLaunchSpecification -> Maybe Text
ramdiskId :: Prelude.Maybe Prelude.Text,
    -- | One or more security group IDs.
    RequestSpotLaunchSpecification -> Maybe [Text]
securityGroupIds :: Prelude.Maybe [Prelude.Text],
    -- | One or more security groups. When requesting instances in a VPC, you
    -- must specify the IDs of the security groups. When requesting instances
    -- in EC2-Classic, you can specify the names or the IDs of the security
    -- groups.
    RequestSpotLaunchSpecification -> Maybe [Text]
securityGroups :: Prelude.Maybe [Prelude.Text],
    -- | The ID of the subnet in which to launch the instance.
    RequestSpotLaunchSpecification -> Maybe Text
subnetId :: Prelude.Maybe Prelude.Text,
    -- | The Base64-encoded user data for the instance. User data is limited to
    -- 16 KB.
    RequestSpotLaunchSpecification -> Maybe Text
userData :: Prelude.Maybe Prelude.Text
  }
  deriving (RequestSpotLaunchSpecification
-> RequestSpotLaunchSpecification -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: RequestSpotLaunchSpecification
-> RequestSpotLaunchSpecification -> Bool
$c/= :: RequestSpotLaunchSpecification
-> RequestSpotLaunchSpecification -> Bool
== :: RequestSpotLaunchSpecification
-> RequestSpotLaunchSpecification -> Bool
$c== :: RequestSpotLaunchSpecification
-> RequestSpotLaunchSpecification -> Bool
Prelude.Eq, ReadPrec [RequestSpotLaunchSpecification]
ReadPrec RequestSpotLaunchSpecification
Int -> ReadS RequestSpotLaunchSpecification
ReadS [RequestSpotLaunchSpecification]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [RequestSpotLaunchSpecification]
$creadListPrec :: ReadPrec [RequestSpotLaunchSpecification]
readPrec :: ReadPrec RequestSpotLaunchSpecification
$creadPrec :: ReadPrec RequestSpotLaunchSpecification
readList :: ReadS [RequestSpotLaunchSpecification]
$creadList :: ReadS [RequestSpotLaunchSpecification]
readsPrec :: Int -> ReadS RequestSpotLaunchSpecification
$creadsPrec :: Int -> ReadS RequestSpotLaunchSpecification
Prelude.Read, Int -> RequestSpotLaunchSpecification -> ShowS
[RequestSpotLaunchSpecification] -> ShowS
RequestSpotLaunchSpecification -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [RequestSpotLaunchSpecification] -> ShowS
$cshowList :: [RequestSpotLaunchSpecification] -> ShowS
show :: RequestSpotLaunchSpecification -> String
$cshow :: RequestSpotLaunchSpecification -> String
showsPrec :: Int -> RequestSpotLaunchSpecification -> ShowS
$cshowsPrec :: Int -> RequestSpotLaunchSpecification -> ShowS
Prelude.Show, forall x.
Rep RequestSpotLaunchSpecification x
-> RequestSpotLaunchSpecification
forall x.
RequestSpotLaunchSpecification
-> Rep RequestSpotLaunchSpecification x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep RequestSpotLaunchSpecification x
-> RequestSpotLaunchSpecification
$cfrom :: forall x.
RequestSpotLaunchSpecification
-> Rep RequestSpotLaunchSpecification x
Prelude.Generic)

-- |
-- Create a value of 'RequestSpotLaunchSpecification' 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:
--
-- 'addressingType', 'requestSpotLaunchSpecification_addressingType' - Deprecated.
--
-- 'blockDeviceMappings', 'requestSpotLaunchSpecification_blockDeviceMappings' - One or more block device mapping entries. You can\'t specify both a
-- snapshot ID and an encryption value. This is because only blank volumes
-- can be encrypted on creation. If a snapshot is the basis for a volume,
-- it is not blank and its encryption status is used for the volume
-- encryption status.
--
-- 'ebsOptimized', 'requestSpotLaunchSpecification_ebsOptimized' - Indicates whether the instance is optimized for EBS I\/O. This
-- optimization provides dedicated throughput to Amazon EBS and an
-- optimized configuration stack to provide optimal EBS I\/O performance.
-- This optimization isn\'t available with all instance types. Additional
-- usage charges apply when using an EBS Optimized instance.
--
-- Default: @false@
--
-- 'iamInstanceProfile', 'requestSpotLaunchSpecification_iamInstanceProfile' - The IAM instance profile.
--
-- 'imageId', 'requestSpotLaunchSpecification_imageId' - The ID of the AMI.
--
-- 'instanceType', 'requestSpotLaunchSpecification_instanceType' - The instance type. Only one instance type can be specified.
--
-- 'kernelId', 'requestSpotLaunchSpecification_kernelId' - The ID of the kernel.
--
-- 'keyName', 'requestSpotLaunchSpecification_keyName' - The name of the key pair.
--
-- 'monitoring', 'requestSpotLaunchSpecification_monitoring' - Indicates whether basic or detailed monitoring is enabled for the
-- instance.
--
-- Default: Disabled
--
-- 'networkInterfaces', 'requestSpotLaunchSpecification_networkInterfaces' - One or more network interfaces. If you specify a network interface, you
-- must specify subnet IDs and security group IDs using the network
-- interface.
--
-- 'placement', 'requestSpotLaunchSpecification_placement' - The placement information for the instance.
--
-- 'ramdiskId', 'requestSpotLaunchSpecification_ramdiskId' - The ID of the RAM disk.
--
-- 'securityGroupIds', 'requestSpotLaunchSpecification_securityGroupIds' - One or more security group IDs.
--
-- 'securityGroups', 'requestSpotLaunchSpecification_securityGroups' - One or more security groups. When requesting instances in a VPC, you
-- must specify the IDs of the security groups. When requesting instances
-- in EC2-Classic, you can specify the names or the IDs of the security
-- groups.
--
-- 'subnetId', 'requestSpotLaunchSpecification_subnetId' - The ID of the subnet in which to launch the instance.
--
-- 'userData', 'requestSpotLaunchSpecification_userData' - The Base64-encoded user data for the instance. User data is limited to
-- 16 KB.
newRequestSpotLaunchSpecification ::
  RequestSpotLaunchSpecification
newRequestSpotLaunchSpecification :: RequestSpotLaunchSpecification
newRequestSpotLaunchSpecification =
  RequestSpotLaunchSpecification'
    { $sel:addressingType:RequestSpotLaunchSpecification' :: Maybe Text
addressingType =
        forall a. Maybe a
Prelude.Nothing,
      $sel:blockDeviceMappings:RequestSpotLaunchSpecification' :: Maybe [BlockDeviceMapping]
blockDeviceMappings = forall a. Maybe a
Prelude.Nothing,
      $sel:ebsOptimized:RequestSpotLaunchSpecification' :: Maybe Bool
ebsOptimized = forall a. Maybe a
Prelude.Nothing,
      $sel:iamInstanceProfile:RequestSpotLaunchSpecification' :: Maybe IamInstanceProfileSpecification
iamInstanceProfile = forall a. Maybe a
Prelude.Nothing,
      $sel:imageId:RequestSpotLaunchSpecification' :: Maybe Text
imageId = forall a. Maybe a
Prelude.Nothing,
      $sel:instanceType:RequestSpotLaunchSpecification' :: Maybe InstanceType
instanceType = forall a. Maybe a
Prelude.Nothing,
      $sel:kernelId:RequestSpotLaunchSpecification' :: Maybe Text
kernelId = forall a. Maybe a
Prelude.Nothing,
      $sel:keyName:RequestSpotLaunchSpecification' :: Maybe Text
keyName = forall a. Maybe a
Prelude.Nothing,
      $sel:monitoring:RequestSpotLaunchSpecification' :: Maybe RunInstancesMonitoringEnabled
monitoring = forall a. Maybe a
Prelude.Nothing,
      $sel:networkInterfaces:RequestSpotLaunchSpecification' :: Maybe [InstanceNetworkInterfaceSpecification]
networkInterfaces = forall a. Maybe a
Prelude.Nothing,
      $sel:placement:RequestSpotLaunchSpecification' :: Maybe SpotPlacement
placement = forall a. Maybe a
Prelude.Nothing,
      $sel:ramdiskId:RequestSpotLaunchSpecification' :: Maybe Text
ramdiskId = forall a. Maybe a
Prelude.Nothing,
      $sel:securityGroupIds:RequestSpotLaunchSpecification' :: Maybe [Text]
securityGroupIds = forall a. Maybe a
Prelude.Nothing,
      $sel:securityGroups:RequestSpotLaunchSpecification' :: Maybe [Text]
securityGroups = forall a. Maybe a
Prelude.Nothing,
      $sel:subnetId:RequestSpotLaunchSpecification' :: Maybe Text
subnetId = forall a. Maybe a
Prelude.Nothing,
      $sel:userData:RequestSpotLaunchSpecification' :: Maybe Text
userData = forall a. Maybe a
Prelude.Nothing
    }

-- | Deprecated.
requestSpotLaunchSpecification_addressingType :: Lens.Lens' RequestSpotLaunchSpecification (Prelude.Maybe Prelude.Text)
requestSpotLaunchSpecification_addressingType :: Lens' RequestSpotLaunchSpecification (Maybe Text)
requestSpotLaunchSpecification_addressingType = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\RequestSpotLaunchSpecification' {Maybe Text
addressingType :: Maybe Text
$sel:addressingType:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Text
addressingType} -> Maybe Text
addressingType) (\s :: RequestSpotLaunchSpecification
s@RequestSpotLaunchSpecification' {} Maybe Text
a -> RequestSpotLaunchSpecification
s {$sel:addressingType:RequestSpotLaunchSpecification' :: Maybe Text
addressingType = Maybe Text
a} :: RequestSpotLaunchSpecification)

-- | One or more block device mapping entries. You can\'t specify both a
-- snapshot ID and an encryption value. This is because only blank volumes
-- can be encrypted on creation. If a snapshot is the basis for a volume,
-- it is not blank and its encryption status is used for the volume
-- encryption status.
requestSpotLaunchSpecification_blockDeviceMappings :: Lens.Lens' RequestSpotLaunchSpecification (Prelude.Maybe [BlockDeviceMapping])
requestSpotLaunchSpecification_blockDeviceMappings :: Lens' RequestSpotLaunchSpecification (Maybe [BlockDeviceMapping])
requestSpotLaunchSpecification_blockDeviceMappings = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\RequestSpotLaunchSpecification' {Maybe [BlockDeviceMapping]
blockDeviceMappings :: Maybe [BlockDeviceMapping]
$sel:blockDeviceMappings:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe [BlockDeviceMapping]
blockDeviceMappings} -> Maybe [BlockDeviceMapping]
blockDeviceMappings) (\s :: RequestSpotLaunchSpecification
s@RequestSpotLaunchSpecification' {} Maybe [BlockDeviceMapping]
a -> RequestSpotLaunchSpecification
s {$sel:blockDeviceMappings:RequestSpotLaunchSpecification' :: Maybe [BlockDeviceMapping]
blockDeviceMappings = Maybe [BlockDeviceMapping]
a} :: RequestSpotLaunchSpecification) 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

-- | Indicates whether the instance is optimized for EBS I\/O. This
-- optimization provides dedicated throughput to Amazon EBS and an
-- optimized configuration stack to provide optimal EBS I\/O performance.
-- This optimization isn\'t available with all instance types. Additional
-- usage charges apply when using an EBS Optimized instance.
--
-- Default: @false@
requestSpotLaunchSpecification_ebsOptimized :: Lens.Lens' RequestSpotLaunchSpecification (Prelude.Maybe Prelude.Bool)
requestSpotLaunchSpecification_ebsOptimized :: Lens' RequestSpotLaunchSpecification (Maybe Bool)
requestSpotLaunchSpecification_ebsOptimized = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\RequestSpotLaunchSpecification' {Maybe Bool
ebsOptimized :: Maybe Bool
$sel:ebsOptimized:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Bool
ebsOptimized} -> Maybe Bool
ebsOptimized) (\s :: RequestSpotLaunchSpecification
s@RequestSpotLaunchSpecification' {} Maybe Bool
a -> RequestSpotLaunchSpecification
s {$sel:ebsOptimized:RequestSpotLaunchSpecification' :: Maybe Bool
ebsOptimized = Maybe Bool
a} :: RequestSpotLaunchSpecification)

-- | The IAM instance profile.
requestSpotLaunchSpecification_iamInstanceProfile :: Lens.Lens' RequestSpotLaunchSpecification (Prelude.Maybe IamInstanceProfileSpecification)
requestSpotLaunchSpecification_iamInstanceProfile :: Lens'
  RequestSpotLaunchSpecification
  (Maybe IamInstanceProfileSpecification)
requestSpotLaunchSpecification_iamInstanceProfile = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\RequestSpotLaunchSpecification' {Maybe IamInstanceProfileSpecification
iamInstanceProfile :: Maybe IamInstanceProfileSpecification
$sel:iamInstanceProfile:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification
-> Maybe IamInstanceProfileSpecification
iamInstanceProfile} -> Maybe IamInstanceProfileSpecification
iamInstanceProfile) (\s :: RequestSpotLaunchSpecification
s@RequestSpotLaunchSpecification' {} Maybe IamInstanceProfileSpecification
a -> RequestSpotLaunchSpecification
s {$sel:iamInstanceProfile:RequestSpotLaunchSpecification' :: Maybe IamInstanceProfileSpecification
iamInstanceProfile = Maybe IamInstanceProfileSpecification
a} :: RequestSpotLaunchSpecification)

-- | The ID of the AMI.
requestSpotLaunchSpecification_imageId :: Lens.Lens' RequestSpotLaunchSpecification (Prelude.Maybe Prelude.Text)
requestSpotLaunchSpecification_imageId :: Lens' RequestSpotLaunchSpecification (Maybe Text)
requestSpotLaunchSpecification_imageId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\RequestSpotLaunchSpecification' {Maybe Text
imageId :: Maybe Text
$sel:imageId:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Text
imageId} -> Maybe Text
imageId) (\s :: RequestSpotLaunchSpecification
s@RequestSpotLaunchSpecification' {} Maybe Text
a -> RequestSpotLaunchSpecification
s {$sel:imageId:RequestSpotLaunchSpecification' :: Maybe Text
imageId = Maybe Text
a} :: RequestSpotLaunchSpecification)

-- | The instance type. Only one instance type can be specified.
requestSpotLaunchSpecification_instanceType :: Lens.Lens' RequestSpotLaunchSpecification (Prelude.Maybe InstanceType)
requestSpotLaunchSpecification_instanceType :: Lens' RequestSpotLaunchSpecification (Maybe InstanceType)
requestSpotLaunchSpecification_instanceType = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\RequestSpotLaunchSpecification' {Maybe InstanceType
instanceType :: Maybe InstanceType
$sel:instanceType:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe InstanceType
instanceType} -> Maybe InstanceType
instanceType) (\s :: RequestSpotLaunchSpecification
s@RequestSpotLaunchSpecification' {} Maybe InstanceType
a -> RequestSpotLaunchSpecification
s {$sel:instanceType:RequestSpotLaunchSpecification' :: Maybe InstanceType
instanceType = Maybe InstanceType
a} :: RequestSpotLaunchSpecification)

-- | The ID of the kernel.
requestSpotLaunchSpecification_kernelId :: Lens.Lens' RequestSpotLaunchSpecification (Prelude.Maybe Prelude.Text)
requestSpotLaunchSpecification_kernelId :: Lens' RequestSpotLaunchSpecification (Maybe Text)
requestSpotLaunchSpecification_kernelId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\RequestSpotLaunchSpecification' {Maybe Text
kernelId :: Maybe Text
$sel:kernelId:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Text
kernelId} -> Maybe Text
kernelId) (\s :: RequestSpotLaunchSpecification
s@RequestSpotLaunchSpecification' {} Maybe Text
a -> RequestSpotLaunchSpecification
s {$sel:kernelId:RequestSpotLaunchSpecification' :: Maybe Text
kernelId = Maybe Text
a} :: RequestSpotLaunchSpecification)

-- | The name of the key pair.
requestSpotLaunchSpecification_keyName :: Lens.Lens' RequestSpotLaunchSpecification (Prelude.Maybe Prelude.Text)
requestSpotLaunchSpecification_keyName :: Lens' RequestSpotLaunchSpecification (Maybe Text)
requestSpotLaunchSpecification_keyName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\RequestSpotLaunchSpecification' {Maybe Text
keyName :: Maybe Text
$sel:keyName:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Text
keyName} -> Maybe Text
keyName) (\s :: RequestSpotLaunchSpecification
s@RequestSpotLaunchSpecification' {} Maybe Text
a -> RequestSpotLaunchSpecification
s {$sel:keyName:RequestSpotLaunchSpecification' :: Maybe Text
keyName = Maybe Text
a} :: RequestSpotLaunchSpecification)

-- | Indicates whether basic or detailed monitoring is enabled for the
-- instance.
--
-- Default: Disabled
requestSpotLaunchSpecification_monitoring :: Lens.Lens' RequestSpotLaunchSpecification (Prelude.Maybe RunInstancesMonitoringEnabled)
requestSpotLaunchSpecification_monitoring :: Lens'
  RequestSpotLaunchSpecification
  (Maybe RunInstancesMonitoringEnabled)
requestSpotLaunchSpecification_monitoring = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\RequestSpotLaunchSpecification' {Maybe RunInstancesMonitoringEnabled
monitoring :: Maybe RunInstancesMonitoringEnabled
$sel:monitoring:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification
-> Maybe RunInstancesMonitoringEnabled
monitoring} -> Maybe RunInstancesMonitoringEnabled
monitoring) (\s :: RequestSpotLaunchSpecification
s@RequestSpotLaunchSpecification' {} Maybe RunInstancesMonitoringEnabled
a -> RequestSpotLaunchSpecification
s {$sel:monitoring:RequestSpotLaunchSpecification' :: Maybe RunInstancesMonitoringEnabled
monitoring = Maybe RunInstancesMonitoringEnabled
a} :: RequestSpotLaunchSpecification)

-- | One or more network interfaces. If you specify a network interface, you
-- must specify subnet IDs and security group IDs using the network
-- interface.
requestSpotLaunchSpecification_networkInterfaces :: Lens.Lens' RequestSpotLaunchSpecification (Prelude.Maybe [InstanceNetworkInterfaceSpecification])
requestSpotLaunchSpecification_networkInterfaces :: Lens'
  RequestSpotLaunchSpecification
  (Maybe [InstanceNetworkInterfaceSpecification])
requestSpotLaunchSpecification_networkInterfaces = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\RequestSpotLaunchSpecification' {Maybe [InstanceNetworkInterfaceSpecification]
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecification]
$sel:networkInterfaces:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification
-> Maybe [InstanceNetworkInterfaceSpecification]
networkInterfaces} -> Maybe [InstanceNetworkInterfaceSpecification]
networkInterfaces) (\s :: RequestSpotLaunchSpecification
s@RequestSpotLaunchSpecification' {} Maybe [InstanceNetworkInterfaceSpecification]
a -> RequestSpotLaunchSpecification
s {$sel:networkInterfaces:RequestSpotLaunchSpecification' :: Maybe [InstanceNetworkInterfaceSpecification]
networkInterfaces = Maybe [InstanceNetworkInterfaceSpecification]
a} :: RequestSpotLaunchSpecification) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced

-- | The placement information for the instance.
requestSpotLaunchSpecification_placement :: Lens.Lens' RequestSpotLaunchSpecification (Prelude.Maybe SpotPlacement)
requestSpotLaunchSpecification_placement :: Lens' RequestSpotLaunchSpecification (Maybe SpotPlacement)
requestSpotLaunchSpecification_placement = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\RequestSpotLaunchSpecification' {Maybe SpotPlacement
placement :: Maybe SpotPlacement
$sel:placement:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe SpotPlacement
placement} -> Maybe SpotPlacement
placement) (\s :: RequestSpotLaunchSpecification
s@RequestSpotLaunchSpecification' {} Maybe SpotPlacement
a -> RequestSpotLaunchSpecification
s {$sel:placement:RequestSpotLaunchSpecification' :: Maybe SpotPlacement
placement = Maybe SpotPlacement
a} :: RequestSpotLaunchSpecification)

-- | The ID of the RAM disk.
requestSpotLaunchSpecification_ramdiskId :: Lens.Lens' RequestSpotLaunchSpecification (Prelude.Maybe Prelude.Text)
requestSpotLaunchSpecification_ramdiskId :: Lens' RequestSpotLaunchSpecification (Maybe Text)
requestSpotLaunchSpecification_ramdiskId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\RequestSpotLaunchSpecification' {Maybe Text
ramdiskId :: Maybe Text
$sel:ramdiskId:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Text
ramdiskId} -> Maybe Text
ramdiskId) (\s :: RequestSpotLaunchSpecification
s@RequestSpotLaunchSpecification' {} Maybe Text
a -> RequestSpotLaunchSpecification
s {$sel:ramdiskId:RequestSpotLaunchSpecification' :: Maybe Text
ramdiskId = Maybe Text
a} :: RequestSpotLaunchSpecification)

-- | One or more security group IDs.
requestSpotLaunchSpecification_securityGroupIds :: Lens.Lens' RequestSpotLaunchSpecification (Prelude.Maybe [Prelude.Text])
requestSpotLaunchSpecification_securityGroupIds :: Lens' RequestSpotLaunchSpecification (Maybe [Text])
requestSpotLaunchSpecification_securityGroupIds = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\RequestSpotLaunchSpecification' {Maybe [Text]
securityGroupIds :: Maybe [Text]
$sel:securityGroupIds:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe [Text]
securityGroupIds} -> Maybe [Text]
securityGroupIds) (\s :: RequestSpotLaunchSpecification
s@RequestSpotLaunchSpecification' {} Maybe [Text]
a -> RequestSpotLaunchSpecification
s {$sel:securityGroupIds:RequestSpotLaunchSpecification' :: Maybe [Text]
securityGroupIds = Maybe [Text]
a} :: RequestSpotLaunchSpecification) 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

-- | One or more security groups. When requesting instances in a VPC, you
-- must specify the IDs of the security groups. When requesting instances
-- in EC2-Classic, you can specify the names or the IDs of the security
-- groups.
requestSpotLaunchSpecification_securityGroups :: Lens.Lens' RequestSpotLaunchSpecification (Prelude.Maybe [Prelude.Text])
requestSpotLaunchSpecification_securityGroups :: Lens' RequestSpotLaunchSpecification (Maybe [Text])
requestSpotLaunchSpecification_securityGroups = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\RequestSpotLaunchSpecification' {Maybe [Text]
securityGroups :: Maybe [Text]
$sel:securityGroups:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe [Text]
securityGroups} -> Maybe [Text]
securityGroups) (\s :: RequestSpotLaunchSpecification
s@RequestSpotLaunchSpecification' {} Maybe [Text]
a -> RequestSpotLaunchSpecification
s {$sel:securityGroups:RequestSpotLaunchSpecification' :: Maybe [Text]
securityGroups = Maybe [Text]
a} :: RequestSpotLaunchSpecification) 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 ID of the subnet in which to launch the instance.
requestSpotLaunchSpecification_subnetId :: Lens.Lens' RequestSpotLaunchSpecification (Prelude.Maybe Prelude.Text)
requestSpotLaunchSpecification_subnetId :: Lens' RequestSpotLaunchSpecification (Maybe Text)
requestSpotLaunchSpecification_subnetId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\RequestSpotLaunchSpecification' {Maybe Text
subnetId :: Maybe Text
$sel:subnetId:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Text
subnetId} -> Maybe Text
subnetId) (\s :: RequestSpotLaunchSpecification
s@RequestSpotLaunchSpecification' {} Maybe Text
a -> RequestSpotLaunchSpecification
s {$sel:subnetId:RequestSpotLaunchSpecification' :: Maybe Text
subnetId = Maybe Text
a} :: RequestSpotLaunchSpecification)

-- | The Base64-encoded user data for the instance. User data is limited to
-- 16 KB.
requestSpotLaunchSpecification_userData :: Lens.Lens' RequestSpotLaunchSpecification (Prelude.Maybe Prelude.Text)
requestSpotLaunchSpecification_userData :: Lens' RequestSpotLaunchSpecification (Maybe Text)
requestSpotLaunchSpecification_userData = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\RequestSpotLaunchSpecification' {Maybe Text
userData :: Maybe Text
$sel:userData:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Text
userData} -> Maybe Text
userData) (\s :: RequestSpotLaunchSpecification
s@RequestSpotLaunchSpecification' {} Maybe Text
a -> RequestSpotLaunchSpecification
s {$sel:userData:RequestSpotLaunchSpecification' :: Maybe Text
userData = Maybe Text
a} :: RequestSpotLaunchSpecification)

instance
  Prelude.Hashable
    RequestSpotLaunchSpecification
  where
  hashWithSalt :: Int -> RequestSpotLaunchSpecification -> Int
hashWithSalt
    Int
_salt
    RequestSpotLaunchSpecification' {Maybe Bool
Maybe [Text]
Maybe [InstanceNetworkInterfaceSpecification]
Maybe [BlockDeviceMapping]
Maybe Text
Maybe IamInstanceProfileSpecification
Maybe InstanceType
Maybe RunInstancesMonitoringEnabled
Maybe SpotPlacement
userData :: Maybe Text
subnetId :: Maybe Text
securityGroups :: Maybe [Text]
securityGroupIds :: Maybe [Text]
ramdiskId :: Maybe Text
placement :: Maybe SpotPlacement
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecification]
monitoring :: Maybe RunInstancesMonitoringEnabled
keyName :: Maybe Text
kernelId :: Maybe Text
instanceType :: Maybe InstanceType
imageId :: Maybe Text
iamInstanceProfile :: Maybe IamInstanceProfileSpecification
ebsOptimized :: Maybe Bool
blockDeviceMappings :: Maybe [BlockDeviceMapping]
addressingType :: Maybe Text
$sel:userData:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Text
$sel:subnetId:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Text
$sel:securityGroups:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe [Text]
$sel:securityGroupIds:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe [Text]
$sel:ramdiskId:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Text
$sel:placement:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe SpotPlacement
$sel:networkInterfaces:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification
-> Maybe [InstanceNetworkInterfaceSpecification]
$sel:monitoring:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification
-> Maybe RunInstancesMonitoringEnabled
$sel:keyName:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Text
$sel:kernelId:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Text
$sel:instanceType:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe InstanceType
$sel:imageId:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Text
$sel:iamInstanceProfile:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification
-> Maybe IamInstanceProfileSpecification
$sel:ebsOptimized:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Bool
$sel:blockDeviceMappings:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe [BlockDeviceMapping]
$sel:addressingType:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Text
..} =
      Int
_salt
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
addressingType
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [BlockDeviceMapping]
blockDeviceMappings
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Bool
ebsOptimized
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe IamInstanceProfileSpecification
iamInstanceProfile
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
imageId
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe InstanceType
instanceType
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
kernelId
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
keyName
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe RunInstancesMonitoringEnabled
monitoring
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [InstanceNetworkInterfaceSpecification]
networkInterfaces
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe SpotPlacement
placement
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
ramdiskId
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [Text]
securityGroupIds
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [Text]
securityGroups
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
subnetId
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
userData

instance
  Prelude.NFData
    RequestSpotLaunchSpecification
  where
  rnf :: RequestSpotLaunchSpecification -> ()
rnf RequestSpotLaunchSpecification' {Maybe Bool
Maybe [Text]
Maybe [InstanceNetworkInterfaceSpecification]
Maybe [BlockDeviceMapping]
Maybe Text
Maybe IamInstanceProfileSpecification
Maybe InstanceType
Maybe RunInstancesMonitoringEnabled
Maybe SpotPlacement
userData :: Maybe Text
subnetId :: Maybe Text
securityGroups :: Maybe [Text]
securityGroupIds :: Maybe [Text]
ramdiskId :: Maybe Text
placement :: Maybe SpotPlacement
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecification]
monitoring :: Maybe RunInstancesMonitoringEnabled
keyName :: Maybe Text
kernelId :: Maybe Text
instanceType :: Maybe InstanceType
imageId :: Maybe Text
iamInstanceProfile :: Maybe IamInstanceProfileSpecification
ebsOptimized :: Maybe Bool
blockDeviceMappings :: Maybe [BlockDeviceMapping]
addressingType :: Maybe Text
$sel:userData:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Text
$sel:subnetId:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Text
$sel:securityGroups:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe [Text]
$sel:securityGroupIds:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe [Text]
$sel:ramdiskId:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Text
$sel:placement:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe SpotPlacement
$sel:networkInterfaces:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification
-> Maybe [InstanceNetworkInterfaceSpecification]
$sel:monitoring:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification
-> Maybe RunInstancesMonitoringEnabled
$sel:keyName:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Text
$sel:kernelId:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Text
$sel:instanceType:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe InstanceType
$sel:imageId:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Text
$sel:iamInstanceProfile:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification
-> Maybe IamInstanceProfileSpecification
$sel:ebsOptimized:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Bool
$sel:blockDeviceMappings:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe [BlockDeviceMapping]
$sel:addressingType:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Text
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
addressingType
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [BlockDeviceMapping]
blockDeviceMappings
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
ebsOptimized
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe IamInstanceProfileSpecification
iamInstanceProfile
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
imageId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe InstanceType
instanceType
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
kernelId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
keyName
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe RunInstancesMonitoringEnabled
monitoring
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [InstanceNetworkInterfaceSpecification]
networkInterfaces
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe SpotPlacement
placement
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
ramdiskId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [Text]
securityGroupIds
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [Text]
securityGroups
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
subnetId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
userData

instance Data.ToQuery RequestSpotLaunchSpecification where
  toQuery :: RequestSpotLaunchSpecification -> QueryString
toQuery RequestSpotLaunchSpecification' {Maybe Bool
Maybe [Text]
Maybe [InstanceNetworkInterfaceSpecification]
Maybe [BlockDeviceMapping]
Maybe Text
Maybe IamInstanceProfileSpecification
Maybe InstanceType
Maybe RunInstancesMonitoringEnabled
Maybe SpotPlacement
userData :: Maybe Text
subnetId :: Maybe Text
securityGroups :: Maybe [Text]
securityGroupIds :: Maybe [Text]
ramdiskId :: Maybe Text
placement :: Maybe SpotPlacement
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecification]
monitoring :: Maybe RunInstancesMonitoringEnabled
keyName :: Maybe Text
kernelId :: Maybe Text
instanceType :: Maybe InstanceType
imageId :: Maybe Text
iamInstanceProfile :: Maybe IamInstanceProfileSpecification
ebsOptimized :: Maybe Bool
blockDeviceMappings :: Maybe [BlockDeviceMapping]
addressingType :: Maybe Text
$sel:userData:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Text
$sel:subnetId:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Text
$sel:securityGroups:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe [Text]
$sel:securityGroupIds:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe [Text]
$sel:ramdiskId:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Text
$sel:placement:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe SpotPlacement
$sel:networkInterfaces:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification
-> Maybe [InstanceNetworkInterfaceSpecification]
$sel:monitoring:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification
-> Maybe RunInstancesMonitoringEnabled
$sel:keyName:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Text
$sel:kernelId:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Text
$sel:instanceType:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe InstanceType
$sel:imageId:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Text
$sel:iamInstanceProfile:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification
-> Maybe IamInstanceProfileSpecification
$sel:ebsOptimized:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Bool
$sel:blockDeviceMappings:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe [BlockDeviceMapping]
$sel:addressingType:RequestSpotLaunchSpecification' :: RequestSpotLaunchSpecification -> Maybe Text
..} =
    forall a. Monoid a => [a] -> a
Prelude.mconcat
      [ ByteString
"AddressingType" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Text
addressingType,
        forall a. ToQuery a => a -> QueryString
Data.toQuery
          ( forall a.
(IsList a, ToQuery (Item a)) =>
ByteString -> a -> QueryString
Data.toQueryList ByteString
"BlockDeviceMapping"
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [BlockDeviceMapping]
blockDeviceMappings
          ),
        ByteString
"EbsOptimized" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Bool
ebsOptimized,
        ByteString
"IamInstanceProfile" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe IamInstanceProfileSpecification
iamInstanceProfile,
        ByteString
"ImageId" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Text
imageId,
        ByteString
"InstanceType" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe InstanceType
instanceType,
        ByteString
"KernelId" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Text
kernelId,
        ByteString
"KeyName" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Text
keyName,
        ByteString
"Monitoring" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe RunInstancesMonitoringEnabled
monitoring,
        forall a. ToQuery a => a -> QueryString
Data.toQuery
          ( forall a.
(IsList a, ToQuery (Item a)) =>
ByteString -> a -> QueryString
Data.toQueryList ByteString
"NetworkInterface"
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [InstanceNetworkInterfaceSpecification]
networkInterfaces
          ),
        ByteString
"Placement" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe SpotPlacement
placement,
        ByteString
"RamdiskId" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Text
ramdiskId,
        forall a. ToQuery a => a -> QueryString
Data.toQuery
          ( forall a.
(IsList a, ToQuery (Item a)) =>
ByteString -> a -> QueryString
Data.toQueryList ByteString
"SecurityGroupId"
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Text]
securityGroupIds
          ),
        forall a. ToQuery a => a -> QueryString
Data.toQuery
          ( forall a.
(IsList a, ToQuery (Item a)) =>
ByteString -> a -> QueryString
Data.toQueryList ByteString
"SecurityGroup"
              forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Text]
securityGroups
          ),
        ByteString
"SubnetId" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Text
subnetId,
        ByteString
"UserData" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Text
userData
      ]