module Stratosphere.EC2.SpotFleet.SpotFleetLaunchSpecificationProperty (
module Exports, SpotFleetLaunchSpecificationProperty(..),
mkSpotFleetLaunchSpecificationProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.EC2.SpotFleet.BlockDeviceMappingProperty as Exports
import {-# SOURCE #-} Stratosphere.EC2.SpotFleet.GroupIdentifierProperty as Exports
import {-# SOURCE #-} Stratosphere.EC2.SpotFleet.IamInstanceProfileSpecificationProperty as Exports
import {-# SOURCE #-} Stratosphere.EC2.SpotFleet.InstanceNetworkInterfaceSpecificationProperty as Exports
import {-# SOURCE #-} Stratosphere.EC2.SpotFleet.InstanceRequirementsRequestProperty as Exports
import {-# SOURCE #-} Stratosphere.EC2.SpotFleet.SpotFleetMonitoringProperty as Exports
import {-# SOURCE #-} Stratosphere.EC2.SpotFleet.SpotFleetTagSpecificationProperty as Exports
import {-# SOURCE #-} Stratosphere.EC2.SpotFleet.SpotPlacementProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Value
data SpotFleetLaunchSpecificationProperty
=
SpotFleetLaunchSpecificationProperty {SpotFleetLaunchSpecificationProperty -> ()
haddock_workaround_ :: (),
SpotFleetLaunchSpecificationProperty
-> Maybe [BlockDeviceMappingProperty]
blockDeviceMappings :: (Prelude.Maybe [BlockDeviceMappingProperty]),
SpotFleetLaunchSpecificationProperty -> Maybe (Value Bool)
ebsOptimized :: (Prelude.Maybe (Value Prelude.Bool)),
SpotFleetLaunchSpecificationProperty
-> Maybe IamInstanceProfileSpecificationProperty
iamInstanceProfile :: (Prelude.Maybe IamInstanceProfileSpecificationProperty),
SpotFleetLaunchSpecificationProperty -> Value Text
imageId :: (Value Prelude.Text),
SpotFleetLaunchSpecificationProperty
-> Maybe InstanceRequirementsRequestProperty
instanceRequirements :: (Prelude.Maybe InstanceRequirementsRequestProperty),
SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
instanceType :: (Prelude.Maybe (Value Prelude.Text)),
SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
kernelId :: (Prelude.Maybe (Value Prelude.Text)),
SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
keyName :: (Prelude.Maybe (Value Prelude.Text)),
SpotFleetLaunchSpecificationProperty
-> Maybe SpotFleetMonitoringProperty
monitoring :: (Prelude.Maybe SpotFleetMonitoringProperty),
SpotFleetLaunchSpecificationProperty
-> Maybe [InstanceNetworkInterfaceSpecificationProperty]
networkInterfaces :: (Prelude.Maybe [InstanceNetworkInterfaceSpecificationProperty]),
SpotFleetLaunchSpecificationProperty -> Maybe SpotPlacementProperty
placement :: (Prelude.Maybe SpotPlacementProperty),
SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
ramdiskId :: (Prelude.Maybe (Value Prelude.Text)),
SpotFleetLaunchSpecificationProperty
-> Maybe [GroupIdentifierProperty]
securityGroups :: (Prelude.Maybe [GroupIdentifierProperty]),
SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
spotPrice :: (Prelude.Maybe (Value Prelude.Text)),
SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
subnetId :: (Prelude.Maybe (Value Prelude.Text)),
SpotFleetLaunchSpecificationProperty
-> Maybe [SpotFleetTagSpecificationProperty]
tagSpecifications :: (Prelude.Maybe [SpotFleetTagSpecificationProperty]),
SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
userData :: (Prelude.Maybe (Value Prelude.Text)),
SpotFleetLaunchSpecificationProperty -> Maybe (Value Double)
weightedCapacity :: (Prelude.Maybe (Value Prelude.Double))}
deriving stock (SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty -> Bool
(SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty -> Bool)
-> (SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty -> Bool)
-> Eq SpotFleetLaunchSpecificationProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty -> Bool
== :: SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty -> Bool
$c/= :: SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty -> Bool
/= :: SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty -> Bool
Prelude.Eq, Int -> SpotFleetLaunchSpecificationProperty -> ShowS
[SpotFleetLaunchSpecificationProperty] -> ShowS
SpotFleetLaunchSpecificationProperty -> String
(Int -> SpotFleetLaunchSpecificationProperty -> ShowS)
-> (SpotFleetLaunchSpecificationProperty -> String)
-> ([SpotFleetLaunchSpecificationProperty] -> ShowS)
-> Show SpotFleetLaunchSpecificationProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> SpotFleetLaunchSpecificationProperty -> ShowS
showsPrec :: Int -> SpotFleetLaunchSpecificationProperty -> ShowS
$cshow :: SpotFleetLaunchSpecificationProperty -> String
show :: SpotFleetLaunchSpecificationProperty -> String
$cshowList :: [SpotFleetLaunchSpecificationProperty] -> ShowS
showList :: [SpotFleetLaunchSpecificationProperty] -> ShowS
Prelude.Show)
mkSpotFleetLaunchSpecificationProperty ::
Value Prelude.Text -> SpotFleetLaunchSpecificationProperty
mkSpotFleetLaunchSpecificationProperty :: Value Text -> SpotFleetLaunchSpecificationProperty
mkSpotFleetLaunchSpecificationProperty Value Text
imageId
= SpotFleetLaunchSpecificationProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), imageId :: Value Text
imageId = Value Text
imageId,
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
blockDeviceMappings = Maybe [BlockDeviceMappingProperty]
forall a. Maybe a
Prelude.Nothing,
ebsOptimized :: Maybe (Value Bool)
ebsOptimized = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
iamInstanceProfile = Maybe IamInstanceProfileSpecificationProperty
forall a. Maybe a
Prelude.Nothing,
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceRequirements = Maybe InstanceRequirementsRequestProperty
forall a. Maybe a
Prelude.Nothing,
instanceType :: Maybe (Value Text)
instanceType = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, kernelId :: Maybe (Value Text)
kernelId = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
keyName :: Maybe (Value Text)
keyName = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, monitoring :: Maybe SpotFleetMonitoringProperty
monitoring = Maybe SpotFleetMonitoringProperty
forall a. Maybe a
Prelude.Nothing,
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
networkInterfaces = Maybe [InstanceNetworkInterfaceSpecificationProperty]
forall a. Maybe a
Prelude.Nothing, placement :: Maybe SpotPlacementProperty
placement = Maybe SpotPlacementProperty
forall a. Maybe a
Prelude.Nothing,
ramdiskId :: Maybe (Value Text)
ramdiskId = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, securityGroups :: Maybe [GroupIdentifierProperty]
securityGroups = Maybe [GroupIdentifierProperty]
forall a. Maybe a
Prelude.Nothing,
spotPrice :: Maybe (Value Text)
spotPrice = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, subnetId :: Maybe (Value Text)
subnetId = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
tagSpecifications = Maybe [SpotFleetTagSpecificationProperty]
forall a. Maybe a
Prelude.Nothing, userData :: Maybe (Value Text)
userData = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
weightedCapacity :: Maybe (Value Double)
weightedCapacity = Maybe (Value Double)
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties SpotFleetLaunchSpecificationProperty where
toResourceProperties :: SpotFleetLaunchSpecificationProperty -> ResourceProperties
toResourceProperties SpotFleetLaunchSpecificationProperty {Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: SpotFleetLaunchSpecificationProperty -> ()
blockDeviceMappings :: SpotFleetLaunchSpecificationProperty
-> Maybe [BlockDeviceMappingProperty]
ebsOptimized :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Bool)
iamInstanceProfile :: SpotFleetLaunchSpecificationProperty
-> Maybe IamInstanceProfileSpecificationProperty
imageId :: SpotFleetLaunchSpecificationProperty -> Value Text
instanceRequirements :: SpotFleetLaunchSpecificationProperty
-> Maybe InstanceRequirementsRequestProperty
instanceType :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
kernelId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
keyName :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
monitoring :: SpotFleetLaunchSpecificationProperty
-> Maybe SpotFleetMonitoringProperty
networkInterfaces :: SpotFleetLaunchSpecificationProperty
-> Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: SpotFleetLaunchSpecificationProperty -> Maybe SpotPlacementProperty
ramdiskId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
securityGroups :: SpotFleetLaunchSpecificationProperty
-> Maybe [GroupIdentifierProperty]
spotPrice :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
subnetId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
tagSpecifications :: SpotFleetLaunchSpecificationProperty
-> Maybe [SpotFleetTagSpecificationProperty]
userData :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
weightedCapacity :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::EC2::SpotFleet.SpotFleetLaunchSpecification",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Item Object] -> Object
forall l. IsList l => [Item l] -> l
Prelude.fromList
([(Key, Value)] -> [(Key, Value)] -> [(Key, Value)]
forall a. Semigroup a => a -> a -> a
(Prelude.<>)
[Key
"ImageId" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
imageId]
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> [BlockDeviceMappingProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"BlockDeviceMappings" ([BlockDeviceMappingProperty] -> (Key, Value))
-> Maybe [BlockDeviceMappingProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [BlockDeviceMappingProperty]
blockDeviceMappings,
Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"EbsOptimized" (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
ebsOptimized,
Key -> IamInstanceProfileSpecificationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"IamInstanceProfile" (IamInstanceProfileSpecificationProperty -> (Key, Value))
-> Maybe IamInstanceProfileSpecificationProperty
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe IamInstanceProfileSpecificationProperty
iamInstanceProfile,
Key -> InstanceRequirementsRequestProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"InstanceRequirements" (InstanceRequirementsRequestProperty -> (Key, Value))
-> Maybe InstanceRequirementsRequestProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe InstanceRequirementsRequestProperty
instanceRequirements,
Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"InstanceType" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
instanceType,
Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"KernelId" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
kernelId,
Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"KeyName" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
keyName,
Key -> SpotFleetMonitoringProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Monitoring" (SpotFleetMonitoringProperty -> (Key, Value))
-> Maybe SpotFleetMonitoringProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe SpotFleetMonitoringProperty
monitoring,
Key
-> [InstanceNetworkInterfaceSpecificationProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"NetworkInterfaces" ([InstanceNetworkInterfaceSpecificationProperty] -> (Key, Value))
-> Maybe [InstanceNetworkInterfaceSpecificationProperty]
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [InstanceNetworkInterfaceSpecificationProperty]
networkInterfaces,
Key -> SpotPlacementProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Placement" (SpotPlacementProperty -> (Key, Value))
-> Maybe SpotPlacementProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe SpotPlacementProperty
placement,
Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"RamdiskId" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
ramdiskId,
Key -> [GroupIdentifierProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SecurityGroups" ([GroupIdentifierProperty] -> (Key, Value))
-> Maybe [GroupIdentifierProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [GroupIdentifierProperty]
securityGroups,
Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SpotPrice" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
spotPrice,
Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SubnetId" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
subnetId,
Key -> [SpotFleetTagSpecificationProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"TagSpecifications" ([SpotFleetTagSpecificationProperty] -> (Key, Value))
-> Maybe [SpotFleetTagSpecificationProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [SpotFleetTagSpecificationProperty]
tagSpecifications,
Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"UserData" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
userData,
Key -> Value Double -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"WeightedCapacity" (Value Double -> (Key, Value))
-> Maybe (Value Double) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Double)
weightedCapacity]))}
instance JSON.ToJSON SpotFleetLaunchSpecificationProperty where
toJSON :: SpotFleetLaunchSpecificationProperty -> Value
toJSON SpotFleetLaunchSpecificationProperty {Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: SpotFleetLaunchSpecificationProperty -> ()
blockDeviceMappings :: SpotFleetLaunchSpecificationProperty
-> Maybe [BlockDeviceMappingProperty]
ebsOptimized :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Bool)
iamInstanceProfile :: SpotFleetLaunchSpecificationProperty
-> Maybe IamInstanceProfileSpecificationProperty
imageId :: SpotFleetLaunchSpecificationProperty -> Value Text
instanceRequirements :: SpotFleetLaunchSpecificationProperty
-> Maybe InstanceRequirementsRequestProperty
instanceType :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
kernelId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
keyName :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
monitoring :: SpotFleetLaunchSpecificationProperty
-> Maybe SpotFleetMonitoringProperty
networkInterfaces :: SpotFleetLaunchSpecificationProperty
-> Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: SpotFleetLaunchSpecificationProperty -> Maybe SpotPlacementProperty
ramdiskId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
securityGroups :: SpotFleetLaunchSpecificationProperty
-> Maybe [GroupIdentifierProperty]
spotPrice :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
subnetId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
tagSpecifications :: SpotFleetLaunchSpecificationProperty
-> Maybe [SpotFleetTagSpecificationProperty]
userData :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
weightedCapacity :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
= [(Key, Value)] -> Value
JSON.object
([Item [(Key, Value)]] -> [(Key, Value)]
forall l. IsList l => [Item l] -> l
Prelude.fromList
([(Key, Value)] -> [(Key, Value)] -> [(Key, Value)]
forall a. Semigroup a => a -> a -> a
(Prelude.<>)
[Key
"ImageId" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
imageId]
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> [BlockDeviceMappingProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"BlockDeviceMappings" ([BlockDeviceMappingProperty] -> (Key, Value))
-> Maybe [BlockDeviceMappingProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [BlockDeviceMappingProperty]
blockDeviceMappings,
Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"EbsOptimized" (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
ebsOptimized,
Key -> IamInstanceProfileSpecificationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"IamInstanceProfile" (IamInstanceProfileSpecificationProperty -> (Key, Value))
-> Maybe IamInstanceProfileSpecificationProperty
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe IamInstanceProfileSpecificationProperty
iamInstanceProfile,
Key -> InstanceRequirementsRequestProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"InstanceRequirements" (InstanceRequirementsRequestProperty -> (Key, Value))
-> Maybe InstanceRequirementsRequestProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe InstanceRequirementsRequestProperty
instanceRequirements,
Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"InstanceType" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
instanceType,
Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"KernelId" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
kernelId,
Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"KeyName" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
keyName,
Key -> SpotFleetMonitoringProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Monitoring" (SpotFleetMonitoringProperty -> (Key, Value))
-> Maybe SpotFleetMonitoringProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe SpotFleetMonitoringProperty
monitoring,
Key
-> [InstanceNetworkInterfaceSpecificationProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"NetworkInterfaces" ([InstanceNetworkInterfaceSpecificationProperty] -> (Key, Value))
-> Maybe [InstanceNetworkInterfaceSpecificationProperty]
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [InstanceNetworkInterfaceSpecificationProperty]
networkInterfaces,
Key -> SpotPlacementProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Placement" (SpotPlacementProperty -> (Key, Value))
-> Maybe SpotPlacementProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe SpotPlacementProperty
placement,
Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"RamdiskId" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
ramdiskId,
Key -> [GroupIdentifierProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SecurityGroups" ([GroupIdentifierProperty] -> (Key, Value))
-> Maybe [GroupIdentifierProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [GroupIdentifierProperty]
securityGroups,
Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SpotPrice" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
spotPrice,
Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SubnetId" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
subnetId,
Key -> [SpotFleetTagSpecificationProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"TagSpecifications" ([SpotFleetTagSpecificationProperty] -> (Key, Value))
-> Maybe [SpotFleetTagSpecificationProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [SpotFleetTagSpecificationProperty]
tagSpecifications,
Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"UserData" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
userData,
Key -> Value Double -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"WeightedCapacity" (Value Double -> (Key, Value))
-> Maybe (Value Double) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Double)
weightedCapacity])))
instance Property "BlockDeviceMappings" SpotFleetLaunchSpecificationProperty where
type PropertyType "BlockDeviceMappings" SpotFleetLaunchSpecificationProperty = [BlockDeviceMappingProperty]
set :: PropertyType
"BlockDeviceMappings" SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
set PropertyType
"BlockDeviceMappings" SpotFleetLaunchSpecificationProperty
newValue SpotFleetLaunchSpecificationProperty {Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: SpotFleetLaunchSpecificationProperty -> ()
blockDeviceMappings :: SpotFleetLaunchSpecificationProperty
-> Maybe [BlockDeviceMappingProperty]
ebsOptimized :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Bool)
iamInstanceProfile :: SpotFleetLaunchSpecificationProperty
-> Maybe IamInstanceProfileSpecificationProperty
imageId :: SpotFleetLaunchSpecificationProperty -> Value Text
instanceRequirements :: SpotFleetLaunchSpecificationProperty
-> Maybe InstanceRequirementsRequestProperty
instanceType :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
kernelId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
keyName :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
monitoring :: SpotFleetLaunchSpecificationProperty
-> Maybe SpotFleetMonitoringProperty
networkInterfaces :: SpotFleetLaunchSpecificationProperty
-> Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: SpotFleetLaunchSpecificationProperty -> Maybe SpotPlacementProperty
ramdiskId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
securityGroups :: SpotFleetLaunchSpecificationProperty
-> Maybe [GroupIdentifierProperty]
spotPrice :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
subnetId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
tagSpecifications :: SpotFleetLaunchSpecificationProperty
-> Maybe [SpotFleetTagSpecificationProperty]
userData :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
weightedCapacity :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
= SpotFleetLaunchSpecificationProperty
{blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
blockDeviceMappings = [BlockDeviceMappingProperty] -> Maybe [BlockDeviceMappingProperty]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [BlockDeviceMappingProperty]
PropertyType
"BlockDeviceMappings" SpotFleetLaunchSpecificationProperty
newValue, Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: ()
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
haddock_workaround_ :: ()
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
instance Property "EbsOptimized" SpotFleetLaunchSpecificationProperty where
type PropertyType "EbsOptimized" SpotFleetLaunchSpecificationProperty = Value Prelude.Bool
set :: PropertyType "EbsOptimized" SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
set PropertyType "EbsOptimized" SpotFleetLaunchSpecificationProperty
newValue SpotFleetLaunchSpecificationProperty {Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: SpotFleetLaunchSpecificationProperty -> ()
blockDeviceMappings :: SpotFleetLaunchSpecificationProperty
-> Maybe [BlockDeviceMappingProperty]
ebsOptimized :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Bool)
iamInstanceProfile :: SpotFleetLaunchSpecificationProperty
-> Maybe IamInstanceProfileSpecificationProperty
imageId :: SpotFleetLaunchSpecificationProperty -> Value Text
instanceRequirements :: SpotFleetLaunchSpecificationProperty
-> Maybe InstanceRequirementsRequestProperty
instanceType :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
kernelId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
keyName :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
monitoring :: SpotFleetLaunchSpecificationProperty
-> Maybe SpotFleetMonitoringProperty
networkInterfaces :: SpotFleetLaunchSpecificationProperty
-> Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: SpotFleetLaunchSpecificationProperty -> Maybe SpotPlacementProperty
ramdiskId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
securityGroups :: SpotFleetLaunchSpecificationProperty
-> Maybe [GroupIdentifierProperty]
spotPrice :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
subnetId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
tagSpecifications :: SpotFleetLaunchSpecificationProperty
-> Maybe [SpotFleetTagSpecificationProperty]
userData :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
weightedCapacity :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
= SpotFleetLaunchSpecificationProperty
{ebsOptimized :: Maybe (Value Bool)
ebsOptimized = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "EbsOptimized" SpotFleetLaunchSpecificationProperty
Value Bool
newValue, Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
instance Property "IamInstanceProfile" SpotFleetLaunchSpecificationProperty where
type PropertyType "IamInstanceProfile" SpotFleetLaunchSpecificationProperty = IamInstanceProfileSpecificationProperty
set :: PropertyType
"IamInstanceProfile" SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
set PropertyType
"IamInstanceProfile" SpotFleetLaunchSpecificationProperty
newValue SpotFleetLaunchSpecificationProperty {Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: SpotFleetLaunchSpecificationProperty -> ()
blockDeviceMappings :: SpotFleetLaunchSpecificationProperty
-> Maybe [BlockDeviceMappingProperty]
ebsOptimized :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Bool)
iamInstanceProfile :: SpotFleetLaunchSpecificationProperty
-> Maybe IamInstanceProfileSpecificationProperty
imageId :: SpotFleetLaunchSpecificationProperty -> Value Text
instanceRequirements :: SpotFleetLaunchSpecificationProperty
-> Maybe InstanceRequirementsRequestProperty
instanceType :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
kernelId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
keyName :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
monitoring :: SpotFleetLaunchSpecificationProperty
-> Maybe SpotFleetMonitoringProperty
networkInterfaces :: SpotFleetLaunchSpecificationProperty
-> Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: SpotFleetLaunchSpecificationProperty -> Maybe SpotPlacementProperty
ramdiskId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
securityGroups :: SpotFleetLaunchSpecificationProperty
-> Maybe [GroupIdentifierProperty]
spotPrice :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
subnetId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
tagSpecifications :: SpotFleetLaunchSpecificationProperty
-> Maybe [SpotFleetTagSpecificationProperty]
userData :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
weightedCapacity :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
= SpotFleetLaunchSpecificationProperty
{iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
iamInstanceProfile = IamInstanceProfileSpecificationProperty
-> Maybe IamInstanceProfileSpecificationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
"IamInstanceProfile" SpotFleetLaunchSpecificationProperty
IamInstanceProfileSpecificationProperty
newValue, Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
instance Property "ImageId" SpotFleetLaunchSpecificationProperty where
type PropertyType "ImageId" SpotFleetLaunchSpecificationProperty = Value Prelude.Text
set :: PropertyType "ImageId" SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
set PropertyType "ImageId" SpotFleetLaunchSpecificationProperty
newValue SpotFleetLaunchSpecificationProperty {Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: SpotFleetLaunchSpecificationProperty -> ()
blockDeviceMappings :: SpotFleetLaunchSpecificationProperty
-> Maybe [BlockDeviceMappingProperty]
ebsOptimized :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Bool)
iamInstanceProfile :: SpotFleetLaunchSpecificationProperty
-> Maybe IamInstanceProfileSpecificationProperty
imageId :: SpotFleetLaunchSpecificationProperty -> Value Text
instanceRequirements :: SpotFleetLaunchSpecificationProperty
-> Maybe InstanceRequirementsRequestProperty
instanceType :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
kernelId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
keyName :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
monitoring :: SpotFleetLaunchSpecificationProperty
-> Maybe SpotFleetMonitoringProperty
networkInterfaces :: SpotFleetLaunchSpecificationProperty
-> Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: SpotFleetLaunchSpecificationProperty -> Maybe SpotPlacementProperty
ramdiskId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
securityGroups :: SpotFleetLaunchSpecificationProperty
-> Maybe [GroupIdentifierProperty]
spotPrice :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
subnetId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
tagSpecifications :: SpotFleetLaunchSpecificationProperty
-> Maybe [SpotFleetTagSpecificationProperty]
userData :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
weightedCapacity :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
= SpotFleetLaunchSpecificationProperty {imageId :: Value Text
imageId = PropertyType "ImageId" SpotFleetLaunchSpecificationProperty
Value Text
newValue, Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
instance Property "InstanceRequirements" SpotFleetLaunchSpecificationProperty where
type PropertyType "InstanceRequirements" SpotFleetLaunchSpecificationProperty = InstanceRequirementsRequestProperty
set :: PropertyType
"InstanceRequirements" SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
set PropertyType
"InstanceRequirements" SpotFleetLaunchSpecificationProperty
newValue SpotFleetLaunchSpecificationProperty {Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: SpotFleetLaunchSpecificationProperty -> ()
blockDeviceMappings :: SpotFleetLaunchSpecificationProperty
-> Maybe [BlockDeviceMappingProperty]
ebsOptimized :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Bool)
iamInstanceProfile :: SpotFleetLaunchSpecificationProperty
-> Maybe IamInstanceProfileSpecificationProperty
imageId :: SpotFleetLaunchSpecificationProperty -> Value Text
instanceRequirements :: SpotFleetLaunchSpecificationProperty
-> Maybe InstanceRequirementsRequestProperty
instanceType :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
kernelId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
keyName :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
monitoring :: SpotFleetLaunchSpecificationProperty
-> Maybe SpotFleetMonitoringProperty
networkInterfaces :: SpotFleetLaunchSpecificationProperty
-> Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: SpotFleetLaunchSpecificationProperty -> Maybe SpotPlacementProperty
ramdiskId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
securityGroups :: SpotFleetLaunchSpecificationProperty
-> Maybe [GroupIdentifierProperty]
spotPrice :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
subnetId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
tagSpecifications :: SpotFleetLaunchSpecificationProperty
-> Maybe [SpotFleetTagSpecificationProperty]
userData :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
weightedCapacity :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
= SpotFleetLaunchSpecificationProperty
{instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceRequirements = InstanceRequirementsRequestProperty
-> Maybe InstanceRequirementsRequestProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
"InstanceRequirements" SpotFleetLaunchSpecificationProperty
InstanceRequirementsRequestProperty
newValue, Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
()
Value Text
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
instance Property "InstanceType" SpotFleetLaunchSpecificationProperty where
type PropertyType "InstanceType" SpotFleetLaunchSpecificationProperty = Value Prelude.Text
set :: PropertyType "InstanceType" SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
set PropertyType "InstanceType" SpotFleetLaunchSpecificationProperty
newValue SpotFleetLaunchSpecificationProperty {Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: SpotFleetLaunchSpecificationProperty -> ()
blockDeviceMappings :: SpotFleetLaunchSpecificationProperty
-> Maybe [BlockDeviceMappingProperty]
ebsOptimized :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Bool)
iamInstanceProfile :: SpotFleetLaunchSpecificationProperty
-> Maybe IamInstanceProfileSpecificationProperty
imageId :: SpotFleetLaunchSpecificationProperty -> Value Text
instanceRequirements :: SpotFleetLaunchSpecificationProperty
-> Maybe InstanceRequirementsRequestProperty
instanceType :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
kernelId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
keyName :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
monitoring :: SpotFleetLaunchSpecificationProperty
-> Maybe SpotFleetMonitoringProperty
networkInterfaces :: SpotFleetLaunchSpecificationProperty
-> Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: SpotFleetLaunchSpecificationProperty -> Maybe SpotPlacementProperty
ramdiskId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
securityGroups :: SpotFleetLaunchSpecificationProperty
-> Maybe [GroupIdentifierProperty]
spotPrice :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
subnetId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
tagSpecifications :: SpotFleetLaunchSpecificationProperty
-> Maybe [SpotFleetTagSpecificationProperty]
userData :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
weightedCapacity :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
= SpotFleetLaunchSpecificationProperty
{instanceType :: Maybe (Value Text)
instanceType = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "InstanceType" SpotFleetLaunchSpecificationProperty
Value Text
newValue, Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
instance Property "KernelId" SpotFleetLaunchSpecificationProperty where
type PropertyType "KernelId" SpotFleetLaunchSpecificationProperty = Value Prelude.Text
set :: PropertyType "KernelId" SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
set PropertyType "KernelId" SpotFleetLaunchSpecificationProperty
newValue SpotFleetLaunchSpecificationProperty {Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: SpotFleetLaunchSpecificationProperty -> ()
blockDeviceMappings :: SpotFleetLaunchSpecificationProperty
-> Maybe [BlockDeviceMappingProperty]
ebsOptimized :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Bool)
iamInstanceProfile :: SpotFleetLaunchSpecificationProperty
-> Maybe IamInstanceProfileSpecificationProperty
imageId :: SpotFleetLaunchSpecificationProperty -> Value Text
instanceRequirements :: SpotFleetLaunchSpecificationProperty
-> Maybe InstanceRequirementsRequestProperty
instanceType :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
kernelId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
keyName :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
monitoring :: SpotFleetLaunchSpecificationProperty
-> Maybe SpotFleetMonitoringProperty
networkInterfaces :: SpotFleetLaunchSpecificationProperty
-> Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: SpotFleetLaunchSpecificationProperty -> Maybe SpotPlacementProperty
ramdiskId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
securityGroups :: SpotFleetLaunchSpecificationProperty
-> Maybe [GroupIdentifierProperty]
spotPrice :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
subnetId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
tagSpecifications :: SpotFleetLaunchSpecificationProperty
-> Maybe [SpotFleetTagSpecificationProperty]
userData :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
weightedCapacity :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
= SpotFleetLaunchSpecificationProperty
{kernelId :: Maybe (Value Text)
kernelId = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "KernelId" SpotFleetLaunchSpecificationProperty
Value Text
newValue, Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
instance Property "KeyName" SpotFleetLaunchSpecificationProperty where
type PropertyType "KeyName" SpotFleetLaunchSpecificationProperty = Value Prelude.Text
set :: PropertyType "KeyName" SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
set PropertyType "KeyName" SpotFleetLaunchSpecificationProperty
newValue SpotFleetLaunchSpecificationProperty {Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: SpotFleetLaunchSpecificationProperty -> ()
blockDeviceMappings :: SpotFleetLaunchSpecificationProperty
-> Maybe [BlockDeviceMappingProperty]
ebsOptimized :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Bool)
iamInstanceProfile :: SpotFleetLaunchSpecificationProperty
-> Maybe IamInstanceProfileSpecificationProperty
imageId :: SpotFleetLaunchSpecificationProperty -> Value Text
instanceRequirements :: SpotFleetLaunchSpecificationProperty
-> Maybe InstanceRequirementsRequestProperty
instanceType :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
kernelId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
keyName :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
monitoring :: SpotFleetLaunchSpecificationProperty
-> Maybe SpotFleetMonitoringProperty
networkInterfaces :: SpotFleetLaunchSpecificationProperty
-> Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: SpotFleetLaunchSpecificationProperty -> Maybe SpotPlacementProperty
ramdiskId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
securityGroups :: SpotFleetLaunchSpecificationProperty
-> Maybe [GroupIdentifierProperty]
spotPrice :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
subnetId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
tagSpecifications :: SpotFleetLaunchSpecificationProperty
-> Maybe [SpotFleetTagSpecificationProperty]
userData :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
weightedCapacity :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
= SpotFleetLaunchSpecificationProperty
{keyName :: Maybe (Value Text)
keyName = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "KeyName" SpotFleetLaunchSpecificationProperty
Value Text
newValue, Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
instance Property "Monitoring" SpotFleetLaunchSpecificationProperty where
type PropertyType "Monitoring" SpotFleetLaunchSpecificationProperty = SpotFleetMonitoringProperty
set :: PropertyType "Monitoring" SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
set PropertyType "Monitoring" SpotFleetLaunchSpecificationProperty
newValue SpotFleetLaunchSpecificationProperty {Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: SpotFleetLaunchSpecificationProperty -> ()
blockDeviceMappings :: SpotFleetLaunchSpecificationProperty
-> Maybe [BlockDeviceMappingProperty]
ebsOptimized :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Bool)
iamInstanceProfile :: SpotFleetLaunchSpecificationProperty
-> Maybe IamInstanceProfileSpecificationProperty
imageId :: SpotFleetLaunchSpecificationProperty -> Value Text
instanceRequirements :: SpotFleetLaunchSpecificationProperty
-> Maybe InstanceRequirementsRequestProperty
instanceType :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
kernelId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
keyName :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
monitoring :: SpotFleetLaunchSpecificationProperty
-> Maybe SpotFleetMonitoringProperty
networkInterfaces :: SpotFleetLaunchSpecificationProperty
-> Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: SpotFleetLaunchSpecificationProperty -> Maybe SpotPlacementProperty
ramdiskId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
securityGroups :: SpotFleetLaunchSpecificationProperty
-> Maybe [GroupIdentifierProperty]
spotPrice :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
subnetId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
tagSpecifications :: SpotFleetLaunchSpecificationProperty
-> Maybe [SpotFleetTagSpecificationProperty]
userData :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
weightedCapacity :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
= SpotFleetLaunchSpecificationProperty
{monitoring :: Maybe SpotFleetMonitoringProperty
monitoring = SpotFleetMonitoringProperty -> Maybe SpotFleetMonitoringProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Monitoring" SpotFleetLaunchSpecificationProperty
SpotFleetMonitoringProperty
newValue, Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
instance Property "NetworkInterfaces" SpotFleetLaunchSpecificationProperty where
type PropertyType "NetworkInterfaces" SpotFleetLaunchSpecificationProperty = [InstanceNetworkInterfaceSpecificationProperty]
set :: PropertyType
"NetworkInterfaces" SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
set PropertyType
"NetworkInterfaces" SpotFleetLaunchSpecificationProperty
newValue SpotFleetLaunchSpecificationProperty {Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: SpotFleetLaunchSpecificationProperty -> ()
blockDeviceMappings :: SpotFleetLaunchSpecificationProperty
-> Maybe [BlockDeviceMappingProperty]
ebsOptimized :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Bool)
iamInstanceProfile :: SpotFleetLaunchSpecificationProperty
-> Maybe IamInstanceProfileSpecificationProperty
imageId :: SpotFleetLaunchSpecificationProperty -> Value Text
instanceRequirements :: SpotFleetLaunchSpecificationProperty
-> Maybe InstanceRequirementsRequestProperty
instanceType :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
kernelId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
keyName :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
monitoring :: SpotFleetLaunchSpecificationProperty
-> Maybe SpotFleetMonitoringProperty
networkInterfaces :: SpotFleetLaunchSpecificationProperty
-> Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: SpotFleetLaunchSpecificationProperty -> Maybe SpotPlacementProperty
ramdiskId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
securityGroups :: SpotFleetLaunchSpecificationProperty
-> Maybe [GroupIdentifierProperty]
spotPrice :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
subnetId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
tagSpecifications :: SpotFleetLaunchSpecificationProperty
-> Maybe [SpotFleetTagSpecificationProperty]
userData :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
weightedCapacity :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
= SpotFleetLaunchSpecificationProperty
{networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
networkInterfaces = [InstanceNetworkInterfaceSpecificationProperty]
-> Maybe [InstanceNetworkInterfaceSpecificationProperty]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [InstanceNetworkInterfaceSpecificationProperty]
PropertyType
"NetworkInterfaces" SpotFleetLaunchSpecificationProperty
newValue, Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
instance Property "Placement" SpotFleetLaunchSpecificationProperty where
type PropertyType "Placement" SpotFleetLaunchSpecificationProperty = SpotPlacementProperty
set :: PropertyType "Placement" SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
set PropertyType "Placement" SpotFleetLaunchSpecificationProperty
newValue SpotFleetLaunchSpecificationProperty {Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: SpotFleetLaunchSpecificationProperty -> ()
blockDeviceMappings :: SpotFleetLaunchSpecificationProperty
-> Maybe [BlockDeviceMappingProperty]
ebsOptimized :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Bool)
iamInstanceProfile :: SpotFleetLaunchSpecificationProperty
-> Maybe IamInstanceProfileSpecificationProperty
imageId :: SpotFleetLaunchSpecificationProperty -> Value Text
instanceRequirements :: SpotFleetLaunchSpecificationProperty
-> Maybe InstanceRequirementsRequestProperty
instanceType :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
kernelId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
keyName :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
monitoring :: SpotFleetLaunchSpecificationProperty
-> Maybe SpotFleetMonitoringProperty
networkInterfaces :: SpotFleetLaunchSpecificationProperty
-> Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: SpotFleetLaunchSpecificationProperty -> Maybe SpotPlacementProperty
ramdiskId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
securityGroups :: SpotFleetLaunchSpecificationProperty
-> Maybe [GroupIdentifierProperty]
spotPrice :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
subnetId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
tagSpecifications :: SpotFleetLaunchSpecificationProperty
-> Maybe [SpotFleetTagSpecificationProperty]
userData :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
weightedCapacity :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
= SpotFleetLaunchSpecificationProperty
{placement :: Maybe SpotPlacementProperty
placement = SpotPlacementProperty -> Maybe SpotPlacementProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Placement" SpotFleetLaunchSpecificationProperty
SpotPlacementProperty
newValue, Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
instance Property "RamdiskId" SpotFleetLaunchSpecificationProperty where
type PropertyType "RamdiskId" SpotFleetLaunchSpecificationProperty = Value Prelude.Text
set :: PropertyType "RamdiskId" SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
set PropertyType "RamdiskId" SpotFleetLaunchSpecificationProperty
newValue SpotFleetLaunchSpecificationProperty {Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: SpotFleetLaunchSpecificationProperty -> ()
blockDeviceMappings :: SpotFleetLaunchSpecificationProperty
-> Maybe [BlockDeviceMappingProperty]
ebsOptimized :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Bool)
iamInstanceProfile :: SpotFleetLaunchSpecificationProperty
-> Maybe IamInstanceProfileSpecificationProperty
imageId :: SpotFleetLaunchSpecificationProperty -> Value Text
instanceRequirements :: SpotFleetLaunchSpecificationProperty
-> Maybe InstanceRequirementsRequestProperty
instanceType :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
kernelId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
keyName :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
monitoring :: SpotFleetLaunchSpecificationProperty
-> Maybe SpotFleetMonitoringProperty
networkInterfaces :: SpotFleetLaunchSpecificationProperty
-> Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: SpotFleetLaunchSpecificationProperty -> Maybe SpotPlacementProperty
ramdiskId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
securityGroups :: SpotFleetLaunchSpecificationProperty
-> Maybe [GroupIdentifierProperty]
spotPrice :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
subnetId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
tagSpecifications :: SpotFleetLaunchSpecificationProperty
-> Maybe [SpotFleetTagSpecificationProperty]
userData :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
weightedCapacity :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
= SpotFleetLaunchSpecificationProperty
{ramdiskId :: Maybe (Value Text)
ramdiskId = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "RamdiskId" SpotFleetLaunchSpecificationProperty
Value Text
newValue, Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
instance Property "SecurityGroups" SpotFleetLaunchSpecificationProperty where
type PropertyType "SecurityGroups" SpotFleetLaunchSpecificationProperty = [GroupIdentifierProperty]
set :: PropertyType "SecurityGroups" SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
set PropertyType "SecurityGroups" SpotFleetLaunchSpecificationProperty
newValue SpotFleetLaunchSpecificationProperty {Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: SpotFleetLaunchSpecificationProperty -> ()
blockDeviceMappings :: SpotFleetLaunchSpecificationProperty
-> Maybe [BlockDeviceMappingProperty]
ebsOptimized :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Bool)
iamInstanceProfile :: SpotFleetLaunchSpecificationProperty
-> Maybe IamInstanceProfileSpecificationProperty
imageId :: SpotFleetLaunchSpecificationProperty -> Value Text
instanceRequirements :: SpotFleetLaunchSpecificationProperty
-> Maybe InstanceRequirementsRequestProperty
instanceType :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
kernelId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
keyName :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
monitoring :: SpotFleetLaunchSpecificationProperty
-> Maybe SpotFleetMonitoringProperty
networkInterfaces :: SpotFleetLaunchSpecificationProperty
-> Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: SpotFleetLaunchSpecificationProperty -> Maybe SpotPlacementProperty
ramdiskId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
securityGroups :: SpotFleetLaunchSpecificationProperty
-> Maybe [GroupIdentifierProperty]
spotPrice :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
subnetId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
tagSpecifications :: SpotFleetLaunchSpecificationProperty
-> Maybe [SpotFleetTagSpecificationProperty]
userData :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
weightedCapacity :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
= SpotFleetLaunchSpecificationProperty
{securityGroups :: Maybe [GroupIdentifierProperty]
securityGroups = [GroupIdentifierProperty] -> Maybe [GroupIdentifierProperty]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [GroupIdentifierProperty]
PropertyType "SecurityGroups" SpotFleetLaunchSpecificationProperty
newValue, Maybe [BlockDeviceMappingProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
instance Property "SpotPrice" SpotFleetLaunchSpecificationProperty where
type PropertyType "SpotPrice" SpotFleetLaunchSpecificationProperty = Value Prelude.Text
set :: PropertyType "SpotPrice" SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
set PropertyType "SpotPrice" SpotFleetLaunchSpecificationProperty
newValue SpotFleetLaunchSpecificationProperty {Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: SpotFleetLaunchSpecificationProperty -> ()
blockDeviceMappings :: SpotFleetLaunchSpecificationProperty
-> Maybe [BlockDeviceMappingProperty]
ebsOptimized :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Bool)
iamInstanceProfile :: SpotFleetLaunchSpecificationProperty
-> Maybe IamInstanceProfileSpecificationProperty
imageId :: SpotFleetLaunchSpecificationProperty -> Value Text
instanceRequirements :: SpotFleetLaunchSpecificationProperty
-> Maybe InstanceRequirementsRequestProperty
instanceType :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
kernelId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
keyName :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
monitoring :: SpotFleetLaunchSpecificationProperty
-> Maybe SpotFleetMonitoringProperty
networkInterfaces :: SpotFleetLaunchSpecificationProperty
-> Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: SpotFleetLaunchSpecificationProperty -> Maybe SpotPlacementProperty
ramdiskId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
securityGroups :: SpotFleetLaunchSpecificationProperty
-> Maybe [GroupIdentifierProperty]
spotPrice :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
subnetId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
tagSpecifications :: SpotFleetLaunchSpecificationProperty
-> Maybe [SpotFleetTagSpecificationProperty]
userData :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
weightedCapacity :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
= SpotFleetLaunchSpecificationProperty
{spotPrice :: Maybe (Value Text)
spotPrice = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "SpotPrice" SpotFleetLaunchSpecificationProperty
Value Text
newValue, Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
instance Property "SubnetId" SpotFleetLaunchSpecificationProperty where
type PropertyType "SubnetId" SpotFleetLaunchSpecificationProperty = Value Prelude.Text
set :: PropertyType "SubnetId" SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
set PropertyType "SubnetId" SpotFleetLaunchSpecificationProperty
newValue SpotFleetLaunchSpecificationProperty {Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: SpotFleetLaunchSpecificationProperty -> ()
blockDeviceMappings :: SpotFleetLaunchSpecificationProperty
-> Maybe [BlockDeviceMappingProperty]
ebsOptimized :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Bool)
iamInstanceProfile :: SpotFleetLaunchSpecificationProperty
-> Maybe IamInstanceProfileSpecificationProperty
imageId :: SpotFleetLaunchSpecificationProperty -> Value Text
instanceRequirements :: SpotFleetLaunchSpecificationProperty
-> Maybe InstanceRequirementsRequestProperty
instanceType :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
kernelId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
keyName :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
monitoring :: SpotFleetLaunchSpecificationProperty
-> Maybe SpotFleetMonitoringProperty
networkInterfaces :: SpotFleetLaunchSpecificationProperty
-> Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: SpotFleetLaunchSpecificationProperty -> Maybe SpotPlacementProperty
ramdiskId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
securityGroups :: SpotFleetLaunchSpecificationProperty
-> Maybe [GroupIdentifierProperty]
spotPrice :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
subnetId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
tagSpecifications :: SpotFleetLaunchSpecificationProperty
-> Maybe [SpotFleetTagSpecificationProperty]
userData :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
weightedCapacity :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
= SpotFleetLaunchSpecificationProperty
{subnetId :: Maybe (Value Text)
subnetId = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "SubnetId" SpotFleetLaunchSpecificationProperty
Value Text
newValue, Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
instance Property "TagSpecifications" SpotFleetLaunchSpecificationProperty where
type PropertyType "TagSpecifications" SpotFleetLaunchSpecificationProperty = [SpotFleetTagSpecificationProperty]
set :: PropertyType
"TagSpecifications" SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
set PropertyType
"TagSpecifications" SpotFleetLaunchSpecificationProperty
newValue SpotFleetLaunchSpecificationProperty {Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: SpotFleetLaunchSpecificationProperty -> ()
blockDeviceMappings :: SpotFleetLaunchSpecificationProperty
-> Maybe [BlockDeviceMappingProperty]
ebsOptimized :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Bool)
iamInstanceProfile :: SpotFleetLaunchSpecificationProperty
-> Maybe IamInstanceProfileSpecificationProperty
imageId :: SpotFleetLaunchSpecificationProperty -> Value Text
instanceRequirements :: SpotFleetLaunchSpecificationProperty
-> Maybe InstanceRequirementsRequestProperty
instanceType :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
kernelId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
keyName :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
monitoring :: SpotFleetLaunchSpecificationProperty
-> Maybe SpotFleetMonitoringProperty
networkInterfaces :: SpotFleetLaunchSpecificationProperty
-> Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: SpotFleetLaunchSpecificationProperty -> Maybe SpotPlacementProperty
ramdiskId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
securityGroups :: SpotFleetLaunchSpecificationProperty
-> Maybe [GroupIdentifierProperty]
spotPrice :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
subnetId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
tagSpecifications :: SpotFleetLaunchSpecificationProperty
-> Maybe [SpotFleetTagSpecificationProperty]
userData :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
weightedCapacity :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
= SpotFleetLaunchSpecificationProperty
{tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
tagSpecifications = [SpotFleetTagSpecificationProperty]
-> Maybe [SpotFleetTagSpecificationProperty]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [SpotFleetTagSpecificationProperty]
PropertyType
"TagSpecifications" SpotFleetLaunchSpecificationProperty
newValue, Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
instance Property "UserData" SpotFleetLaunchSpecificationProperty where
type PropertyType "UserData" SpotFleetLaunchSpecificationProperty = Value Prelude.Text
set :: PropertyType "UserData" SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
set PropertyType "UserData" SpotFleetLaunchSpecificationProperty
newValue SpotFleetLaunchSpecificationProperty {Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: SpotFleetLaunchSpecificationProperty -> ()
blockDeviceMappings :: SpotFleetLaunchSpecificationProperty
-> Maybe [BlockDeviceMappingProperty]
ebsOptimized :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Bool)
iamInstanceProfile :: SpotFleetLaunchSpecificationProperty
-> Maybe IamInstanceProfileSpecificationProperty
imageId :: SpotFleetLaunchSpecificationProperty -> Value Text
instanceRequirements :: SpotFleetLaunchSpecificationProperty
-> Maybe InstanceRequirementsRequestProperty
instanceType :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
kernelId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
keyName :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
monitoring :: SpotFleetLaunchSpecificationProperty
-> Maybe SpotFleetMonitoringProperty
networkInterfaces :: SpotFleetLaunchSpecificationProperty
-> Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: SpotFleetLaunchSpecificationProperty -> Maybe SpotPlacementProperty
ramdiskId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
securityGroups :: SpotFleetLaunchSpecificationProperty
-> Maybe [GroupIdentifierProperty]
spotPrice :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
subnetId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
tagSpecifications :: SpotFleetLaunchSpecificationProperty
-> Maybe [SpotFleetTagSpecificationProperty]
userData :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
weightedCapacity :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
= SpotFleetLaunchSpecificationProperty
{userData :: Maybe (Value Text)
userData = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "UserData" SpotFleetLaunchSpecificationProperty
Value Text
newValue, Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
weightedCapacity :: Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
weightedCapacity :: Maybe (Value Double)
..}
instance Property "WeightedCapacity" SpotFleetLaunchSpecificationProperty where
type PropertyType "WeightedCapacity" SpotFleetLaunchSpecificationProperty = Value Prelude.Double
set :: PropertyType
"WeightedCapacity" SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
-> SpotFleetLaunchSpecificationProperty
set PropertyType
"WeightedCapacity" SpotFleetLaunchSpecificationProperty
newValue SpotFleetLaunchSpecificationProperty {Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: SpotFleetLaunchSpecificationProperty -> ()
blockDeviceMappings :: SpotFleetLaunchSpecificationProperty
-> Maybe [BlockDeviceMappingProperty]
ebsOptimized :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Bool)
iamInstanceProfile :: SpotFleetLaunchSpecificationProperty
-> Maybe IamInstanceProfileSpecificationProperty
imageId :: SpotFleetLaunchSpecificationProperty -> Value Text
instanceRequirements :: SpotFleetLaunchSpecificationProperty
-> Maybe InstanceRequirementsRequestProperty
instanceType :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
kernelId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
keyName :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
monitoring :: SpotFleetLaunchSpecificationProperty
-> Maybe SpotFleetMonitoringProperty
networkInterfaces :: SpotFleetLaunchSpecificationProperty
-> Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: SpotFleetLaunchSpecificationProperty -> Maybe SpotPlacementProperty
ramdiskId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
securityGroups :: SpotFleetLaunchSpecificationProperty
-> Maybe [GroupIdentifierProperty]
spotPrice :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
subnetId :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
tagSpecifications :: SpotFleetLaunchSpecificationProperty
-> Maybe [SpotFleetTagSpecificationProperty]
userData :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Text)
weightedCapacity :: SpotFleetLaunchSpecificationProperty -> Maybe (Value Double)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
weightedCapacity :: Maybe (Value Double)
..}
= SpotFleetLaunchSpecificationProperty
{weightedCapacity :: Maybe (Value Double)
weightedCapacity = Value Double -> Maybe (Value Double)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
"WeightedCapacity" SpotFleetLaunchSpecificationProperty
Value Double
newValue, Maybe [BlockDeviceMappingProperty]
Maybe [GroupIdentifierProperty]
Maybe [InstanceNetworkInterfaceSpecificationProperty]
Maybe [SpotFleetTagSpecificationProperty]
Maybe (Value Bool)
Maybe (Value Text)
Maybe IamInstanceProfileSpecificationProperty
Maybe SpotFleetMonitoringProperty
Maybe SpotPlacementProperty
Maybe InstanceRequirementsRequestProperty
()
Value Text
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
haddock_workaround_ :: ()
blockDeviceMappings :: Maybe [BlockDeviceMappingProperty]
ebsOptimized :: Maybe (Value Bool)
iamInstanceProfile :: Maybe IamInstanceProfileSpecificationProperty
imageId :: Value Text
instanceRequirements :: Maybe InstanceRequirementsRequestProperty
instanceType :: Maybe (Value Text)
kernelId :: Maybe (Value Text)
keyName :: Maybe (Value Text)
monitoring :: Maybe SpotFleetMonitoringProperty
networkInterfaces :: Maybe [InstanceNetworkInterfaceSpecificationProperty]
placement :: Maybe SpotPlacementProperty
ramdiskId :: Maybe (Value Text)
securityGroups :: Maybe [GroupIdentifierProperty]
spotPrice :: Maybe (Value Text)
subnetId :: Maybe (Value Text)
tagSpecifications :: Maybe [SpotFleetTagSpecificationProperty]
userData :: Maybe (Value Text)
..}