module Stratosphere.EC2.LaunchTemplate.InstanceRequirementsProperty (
module Exports, InstanceRequirementsProperty(..),
mkInstanceRequirementsProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.EC2.LaunchTemplate.AcceleratorCountProperty as Exports
import {-# SOURCE #-} Stratosphere.EC2.LaunchTemplate.AcceleratorTotalMemoryMiBProperty as Exports
import {-# SOURCE #-} Stratosphere.EC2.LaunchTemplate.BaselineEbsBandwidthMbpsProperty as Exports
import {-# SOURCE #-} Stratosphere.EC2.LaunchTemplate.BaselinePerformanceFactorsProperty as Exports
import {-# SOURCE #-} Stratosphere.EC2.LaunchTemplate.MemoryGiBPerVCpuProperty as Exports
import {-# SOURCE #-} Stratosphere.EC2.LaunchTemplate.MemoryMiBProperty as Exports
import {-# SOURCE #-} Stratosphere.EC2.LaunchTemplate.NetworkBandwidthGbpsProperty as Exports
import {-# SOURCE #-} Stratosphere.EC2.LaunchTemplate.NetworkInterfaceCountProperty as Exports
import {-# SOURCE #-} Stratosphere.EC2.LaunchTemplate.TotalLocalStorageGBProperty as Exports
import {-# SOURCE #-} Stratosphere.EC2.LaunchTemplate.VCpuCountProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Value
data InstanceRequirementsProperty
=
InstanceRequirementsProperty {InstanceRequirementsProperty -> ()
haddock_workaround_ :: (),
InstanceRequirementsProperty -> Maybe AcceleratorCountProperty
acceleratorCount :: (Prelude.Maybe AcceleratorCountProperty),
InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorManufacturers :: (Prelude.Maybe (ValueList Prelude.Text)),
InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorNames :: (Prelude.Maybe (ValueList Prelude.Text)),
InstanceRequirementsProperty
-> Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTotalMemoryMiB :: (Prelude.Maybe AcceleratorTotalMemoryMiBProperty),
InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorTypes :: (Prelude.Maybe (ValueList Prelude.Text)),
InstanceRequirementsProperty -> Maybe (ValueList Text)
allowedInstanceTypes :: (Prelude.Maybe (ValueList Prelude.Text)),
InstanceRequirementsProperty -> Maybe (Value Text)
bareMetal :: (Prelude.Maybe (Value Prelude.Text)),
InstanceRequirementsProperty
-> Maybe BaselineEbsBandwidthMbpsProperty
baselineEbsBandwidthMbps :: (Prelude.Maybe BaselineEbsBandwidthMbpsProperty),
InstanceRequirementsProperty
-> Maybe BaselinePerformanceFactorsProperty
baselinePerformanceFactors :: (Prelude.Maybe BaselinePerformanceFactorsProperty),
InstanceRequirementsProperty -> Maybe (Value Text)
burstablePerformance :: (Prelude.Maybe (Value Prelude.Text)),
InstanceRequirementsProperty -> Maybe (ValueList Text)
cpuManufacturers :: (Prelude.Maybe (ValueList Prelude.Text)),
InstanceRequirementsProperty -> Maybe (ValueList Text)
excludedInstanceTypes :: (Prelude.Maybe (ValueList Prelude.Text)),
InstanceRequirementsProperty -> Maybe (ValueList Text)
instanceGenerations :: (Prelude.Maybe (ValueList Prelude.Text)),
InstanceRequirementsProperty -> Maybe (Value Text)
localStorage :: (Prelude.Maybe (Value Prelude.Text)),
InstanceRequirementsProperty -> Maybe (ValueList Text)
localStorageTypes :: (Prelude.Maybe (ValueList Prelude.Text)),
InstanceRequirementsProperty -> Maybe (Value Integer)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: (Prelude.Maybe (Value Prelude.Integer)),
InstanceRequirementsProperty -> Maybe MemoryGiBPerVCpuProperty
memoryGiBPerVCpu :: (Prelude.Maybe MemoryGiBPerVCpuProperty),
InstanceRequirementsProperty -> Maybe MemoryMiBProperty
memoryMiB :: (Prelude.Maybe MemoryMiBProperty),
InstanceRequirementsProperty -> Maybe NetworkBandwidthGbpsProperty
networkBandwidthGbps :: (Prelude.Maybe NetworkBandwidthGbpsProperty),
InstanceRequirementsProperty -> Maybe NetworkInterfaceCountProperty
networkInterfaceCount :: (Prelude.Maybe NetworkInterfaceCountProperty),
InstanceRequirementsProperty -> Maybe (Value Integer)
onDemandMaxPricePercentageOverLowestPrice :: (Prelude.Maybe (Value Prelude.Integer)),
InstanceRequirementsProperty -> Maybe (Value Bool)
requireHibernateSupport :: (Prelude.Maybe (Value Prelude.Bool)),
InstanceRequirementsProperty -> Maybe (Value Integer)
spotMaxPricePercentageOverLowestPrice :: (Prelude.Maybe (Value Prelude.Integer)),
InstanceRequirementsProperty -> Maybe TotalLocalStorageGBProperty
totalLocalStorageGB :: (Prelude.Maybe TotalLocalStorageGBProperty),
InstanceRequirementsProperty -> Maybe VCpuCountProperty
vCpuCount :: (Prelude.Maybe VCpuCountProperty)}
deriving stock (InstanceRequirementsProperty
-> InstanceRequirementsProperty -> Bool
(InstanceRequirementsProperty
-> InstanceRequirementsProperty -> Bool)
-> (InstanceRequirementsProperty
-> InstanceRequirementsProperty -> Bool)
-> Eq InstanceRequirementsProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: InstanceRequirementsProperty
-> InstanceRequirementsProperty -> Bool
== :: InstanceRequirementsProperty
-> InstanceRequirementsProperty -> Bool
$c/= :: InstanceRequirementsProperty
-> InstanceRequirementsProperty -> Bool
/= :: InstanceRequirementsProperty
-> InstanceRequirementsProperty -> Bool
Prelude.Eq, Int -> InstanceRequirementsProperty -> ShowS
[InstanceRequirementsProperty] -> ShowS
InstanceRequirementsProperty -> String
(Int -> InstanceRequirementsProperty -> ShowS)
-> (InstanceRequirementsProperty -> String)
-> ([InstanceRequirementsProperty] -> ShowS)
-> Show InstanceRequirementsProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> InstanceRequirementsProperty -> ShowS
showsPrec :: Int -> InstanceRequirementsProperty -> ShowS
$cshow :: InstanceRequirementsProperty -> String
show :: InstanceRequirementsProperty -> String
$cshowList :: [InstanceRequirementsProperty] -> ShowS
showList :: [InstanceRequirementsProperty] -> ShowS
Prelude.Show)
mkInstanceRequirementsProperty :: InstanceRequirementsProperty
mkInstanceRequirementsProperty :: InstanceRequirementsProperty
mkInstanceRequirementsProperty
= InstanceRequirementsProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorCount = Maybe AcceleratorCountProperty
forall a. Maybe a
Prelude.Nothing,
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorManufacturers = Maybe (ValueList Text)
forall a. Maybe a
Prelude.Nothing,
acceleratorNames :: Maybe (ValueList Text)
acceleratorNames = Maybe (ValueList Text)
forall a. Maybe a
Prelude.Nothing,
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTotalMemoryMiB = Maybe AcceleratorTotalMemoryMiBProperty
forall a. Maybe a
Prelude.Nothing,
acceleratorTypes :: Maybe (ValueList Text)
acceleratorTypes = Maybe (ValueList Text)
forall a. Maybe a
Prelude.Nothing,
allowedInstanceTypes :: Maybe (ValueList Text)
allowedInstanceTypes = Maybe (ValueList Text)
forall a. Maybe a
Prelude.Nothing,
bareMetal :: Maybe (Value Text)
bareMetal = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselineEbsBandwidthMbps = Maybe BaselineEbsBandwidthMbpsProperty
forall a. Maybe a
Prelude.Nothing,
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
baselinePerformanceFactors = Maybe BaselinePerformanceFactorsProperty
forall a. Maybe a
Prelude.Nothing,
burstablePerformance :: Maybe (Value Text)
burstablePerformance = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
cpuManufacturers :: Maybe (ValueList Text)
cpuManufacturers = Maybe (ValueList Text)
forall a. Maybe a
Prelude.Nothing,
excludedInstanceTypes :: Maybe (ValueList Text)
excludedInstanceTypes = Maybe (ValueList Text)
forall a. Maybe a
Prelude.Nothing,
instanceGenerations :: Maybe (ValueList Text)
instanceGenerations = Maybe (ValueList Text)
forall a. Maybe a
Prelude.Nothing,
localStorage :: Maybe (Value Text)
localStorage = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
localStorageTypes :: Maybe (ValueList Text)
localStorageTypes = Maybe (ValueList Text)
forall a. Maybe a
Prelude.Nothing,
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice = Maybe (Value Integer)
forall a. Maybe a
Prelude.Nothing,
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryGiBPerVCpu = Maybe MemoryGiBPerVCpuProperty
forall a. Maybe a
Prelude.Nothing, memoryMiB :: Maybe MemoryMiBProperty
memoryMiB = Maybe MemoryMiBProperty
forall a. Maybe a
Prelude.Nothing,
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkBandwidthGbps = Maybe NetworkBandwidthGbpsProperty
forall a. Maybe a
Prelude.Nothing,
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
networkInterfaceCount = Maybe NetworkInterfaceCountProperty
forall a. Maybe a
Prelude.Nothing,
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
onDemandMaxPricePercentageOverLowestPrice = Maybe (Value Integer)
forall a. Maybe a
Prelude.Nothing,
requireHibernateSupport :: Maybe (Value Bool)
requireHibernateSupport = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
spotMaxPricePercentageOverLowestPrice = Maybe (Value Integer)
forall a. Maybe a
Prelude.Nothing,
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
totalLocalStorageGB = Maybe TotalLocalStorageGBProperty
forall a. Maybe a
Prelude.Nothing, vCpuCount :: Maybe VCpuCountProperty
vCpuCount = Maybe VCpuCountProperty
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties InstanceRequirementsProperty where
toResourceProperties :: InstanceRequirementsProperty -> ResourceProperties
toResourceProperties InstanceRequirementsProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: InstanceRequirementsProperty -> ()
acceleratorCount :: InstanceRequirementsProperty -> Maybe AcceleratorCountProperty
acceleratorManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorNames :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: InstanceRequirementsProperty
-> Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
allowedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
bareMetal :: InstanceRequirementsProperty -> Maybe (Value Text)
baselineEbsBandwidthMbps :: InstanceRequirementsProperty
-> Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: InstanceRequirementsProperty
-> Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: InstanceRequirementsProperty -> Maybe (Value Text)
cpuManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
excludedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
instanceGenerations :: InstanceRequirementsProperty -> Maybe (ValueList Text)
localStorage :: InstanceRequirementsProperty -> Maybe (Value Text)
localStorageTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
memoryGiBPerVCpu :: InstanceRequirementsProperty -> Maybe MemoryGiBPerVCpuProperty
memoryMiB :: InstanceRequirementsProperty -> Maybe MemoryMiBProperty
networkBandwidthGbps :: InstanceRequirementsProperty -> Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: InstanceRequirementsProperty -> Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
requireHibernateSupport :: InstanceRequirementsProperty -> Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
totalLocalStorageGB :: InstanceRequirementsProperty -> Maybe TotalLocalStorageGBProperty
vCpuCount :: InstanceRequirementsProperty -> Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::EC2::LaunchTemplate.InstanceRequirements",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Item Object] -> Object
forall l. IsList l => [Item l] -> l
Prelude.fromList
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> AcceleratorCountProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AcceleratorCount" (AcceleratorCountProperty -> (Key, Value))
-> Maybe AcceleratorCountProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe AcceleratorCountProperty
acceleratorCount,
Key -> ValueList 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
"AcceleratorManufacturers"
(ValueList Text -> (Key, Value))
-> Maybe (ValueList Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (ValueList Text)
acceleratorManufacturers,
Key -> ValueList 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
"AcceleratorNames" (ValueList Text -> (Key, Value))
-> Maybe (ValueList Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (ValueList Text)
acceleratorNames,
Key -> AcceleratorTotalMemoryMiBProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AcceleratorTotalMemoryMiB"
(AcceleratorTotalMemoryMiBProperty -> (Key, Value))
-> Maybe AcceleratorTotalMemoryMiBProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTotalMemoryMiB,
Key -> ValueList 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
"AcceleratorTypes" (ValueList Text -> (Key, Value))
-> Maybe (ValueList Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (ValueList Text)
acceleratorTypes,
Key -> ValueList 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
"AllowedInstanceTypes" (ValueList Text -> (Key, Value))
-> Maybe (ValueList Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (ValueList Text)
allowedInstanceTypes,
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
"BareMetal" (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)
bareMetal,
Key -> BaselineEbsBandwidthMbpsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"BaselineEbsBandwidthMbps"
(BaselineEbsBandwidthMbpsProperty -> (Key, Value))
-> Maybe BaselineEbsBandwidthMbpsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe BaselineEbsBandwidthMbpsProperty
baselineEbsBandwidthMbps,
Key -> BaselinePerformanceFactorsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"BaselinePerformanceFactors"
(BaselinePerformanceFactorsProperty -> (Key, Value))
-> Maybe BaselinePerformanceFactorsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe BaselinePerformanceFactorsProperty
baselinePerformanceFactors,
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
"BurstablePerformance" (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)
burstablePerformance,
Key -> ValueList 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
"CpuManufacturers" (ValueList Text -> (Key, Value))
-> Maybe (ValueList Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (ValueList Text)
cpuManufacturers,
Key -> ValueList 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
"ExcludedInstanceTypes"
(ValueList Text -> (Key, Value))
-> Maybe (ValueList Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (ValueList Text)
excludedInstanceTypes,
Key -> ValueList 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
"InstanceGenerations" (ValueList Text -> (Key, Value))
-> Maybe (ValueList Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (ValueList Text)
instanceGenerations,
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
"LocalStorage" (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)
localStorage,
Key -> ValueList 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
"LocalStorageTypes" (ValueList Text -> (Key, Value))
-> Maybe (ValueList Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (ValueList Text)
localStorageTypes,
Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"MaxSpotPriceAsPercentageOfOptimalOnDemandPrice"
(Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice,
Key -> MemoryGiBPerVCpuProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"MemoryGiBPerVCpu" (MemoryGiBPerVCpuProperty -> (Key, Value))
-> Maybe MemoryGiBPerVCpuProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe MemoryGiBPerVCpuProperty
memoryGiBPerVCpu,
Key -> MemoryMiBProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"MemoryMiB" (MemoryMiBProperty -> (Key, Value))
-> Maybe MemoryMiBProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe MemoryMiBProperty
memoryMiB,
Key -> NetworkBandwidthGbpsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"NetworkBandwidthGbps" (NetworkBandwidthGbpsProperty -> (Key, Value))
-> Maybe NetworkBandwidthGbpsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe NetworkBandwidthGbpsProperty
networkBandwidthGbps,
Key -> NetworkInterfaceCountProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"NetworkInterfaceCount"
(NetworkInterfaceCountProperty -> (Key, Value))
-> Maybe NetworkInterfaceCountProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe NetworkInterfaceCountProperty
networkInterfaceCount,
Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"OnDemandMaxPricePercentageOverLowestPrice"
(Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
onDemandMaxPricePercentageOverLowestPrice,
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
"RequireHibernateSupport"
(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)
requireHibernateSupport,
Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SpotMaxPricePercentageOverLowestPrice"
(Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
spotMaxPricePercentageOverLowestPrice,
Key -> TotalLocalStorageGBProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"TotalLocalStorageGB" (TotalLocalStorageGBProperty -> (Key, Value))
-> Maybe TotalLocalStorageGBProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe TotalLocalStorageGBProperty
totalLocalStorageGB,
Key -> VCpuCountProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"VCpuCount" (VCpuCountProperty -> (Key, Value))
-> Maybe VCpuCountProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe VCpuCountProperty
vCpuCount])}
instance JSON.ToJSON InstanceRequirementsProperty where
toJSON :: InstanceRequirementsProperty -> Value
toJSON InstanceRequirementsProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: InstanceRequirementsProperty -> ()
acceleratorCount :: InstanceRequirementsProperty -> Maybe AcceleratorCountProperty
acceleratorManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorNames :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: InstanceRequirementsProperty
-> Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
allowedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
bareMetal :: InstanceRequirementsProperty -> Maybe (Value Text)
baselineEbsBandwidthMbps :: InstanceRequirementsProperty
-> Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: InstanceRequirementsProperty
-> Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: InstanceRequirementsProperty -> Maybe (Value Text)
cpuManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
excludedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
instanceGenerations :: InstanceRequirementsProperty -> Maybe (ValueList Text)
localStorage :: InstanceRequirementsProperty -> Maybe (Value Text)
localStorageTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
memoryGiBPerVCpu :: InstanceRequirementsProperty -> Maybe MemoryGiBPerVCpuProperty
memoryMiB :: InstanceRequirementsProperty -> Maybe MemoryMiBProperty
networkBandwidthGbps :: InstanceRequirementsProperty -> Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: InstanceRequirementsProperty -> Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
requireHibernateSupport :: InstanceRequirementsProperty -> Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
totalLocalStorageGB :: InstanceRequirementsProperty -> Maybe TotalLocalStorageGBProperty
vCpuCount :: InstanceRequirementsProperty -> Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
= [(Key, Value)] -> Value
JSON.object
([Item [(Key, Value)]] -> [(Key, Value)]
forall l. IsList l => [Item l] -> l
Prelude.fromList
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> AcceleratorCountProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AcceleratorCount" (AcceleratorCountProperty -> (Key, Value))
-> Maybe AcceleratorCountProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe AcceleratorCountProperty
acceleratorCount,
Key -> ValueList 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
"AcceleratorManufacturers"
(ValueList Text -> (Key, Value))
-> Maybe (ValueList Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (ValueList Text)
acceleratorManufacturers,
Key -> ValueList 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
"AcceleratorNames" (ValueList Text -> (Key, Value))
-> Maybe (ValueList Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (ValueList Text)
acceleratorNames,
Key -> AcceleratorTotalMemoryMiBProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AcceleratorTotalMemoryMiB"
(AcceleratorTotalMemoryMiBProperty -> (Key, Value))
-> Maybe AcceleratorTotalMemoryMiBProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTotalMemoryMiB,
Key -> ValueList 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
"AcceleratorTypes" (ValueList Text -> (Key, Value))
-> Maybe (ValueList Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (ValueList Text)
acceleratorTypes,
Key -> ValueList 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
"AllowedInstanceTypes" (ValueList Text -> (Key, Value))
-> Maybe (ValueList Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (ValueList Text)
allowedInstanceTypes,
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
"BareMetal" (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)
bareMetal,
Key -> BaselineEbsBandwidthMbpsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"BaselineEbsBandwidthMbps"
(BaselineEbsBandwidthMbpsProperty -> (Key, Value))
-> Maybe BaselineEbsBandwidthMbpsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe BaselineEbsBandwidthMbpsProperty
baselineEbsBandwidthMbps,
Key -> BaselinePerformanceFactorsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"BaselinePerformanceFactors"
(BaselinePerformanceFactorsProperty -> (Key, Value))
-> Maybe BaselinePerformanceFactorsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe BaselinePerformanceFactorsProperty
baselinePerformanceFactors,
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
"BurstablePerformance" (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)
burstablePerformance,
Key -> ValueList 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
"CpuManufacturers" (ValueList Text -> (Key, Value))
-> Maybe (ValueList Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (ValueList Text)
cpuManufacturers,
Key -> ValueList 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
"ExcludedInstanceTypes"
(ValueList Text -> (Key, Value))
-> Maybe (ValueList Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (ValueList Text)
excludedInstanceTypes,
Key -> ValueList 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
"InstanceGenerations" (ValueList Text -> (Key, Value))
-> Maybe (ValueList Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (ValueList Text)
instanceGenerations,
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
"LocalStorage" (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)
localStorage,
Key -> ValueList 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
"LocalStorageTypes" (ValueList Text -> (Key, Value))
-> Maybe (ValueList Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (ValueList Text)
localStorageTypes,
Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"MaxSpotPriceAsPercentageOfOptimalOnDemandPrice"
(Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice,
Key -> MemoryGiBPerVCpuProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"MemoryGiBPerVCpu" (MemoryGiBPerVCpuProperty -> (Key, Value))
-> Maybe MemoryGiBPerVCpuProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe MemoryGiBPerVCpuProperty
memoryGiBPerVCpu,
Key -> MemoryMiBProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"MemoryMiB" (MemoryMiBProperty -> (Key, Value))
-> Maybe MemoryMiBProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe MemoryMiBProperty
memoryMiB,
Key -> NetworkBandwidthGbpsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"NetworkBandwidthGbps" (NetworkBandwidthGbpsProperty -> (Key, Value))
-> Maybe NetworkBandwidthGbpsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe NetworkBandwidthGbpsProperty
networkBandwidthGbps,
Key -> NetworkInterfaceCountProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"NetworkInterfaceCount"
(NetworkInterfaceCountProperty -> (Key, Value))
-> Maybe NetworkInterfaceCountProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe NetworkInterfaceCountProperty
networkInterfaceCount,
Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"OnDemandMaxPricePercentageOverLowestPrice"
(Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
onDemandMaxPricePercentageOverLowestPrice,
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
"RequireHibernateSupport"
(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)
requireHibernateSupport,
Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SpotMaxPricePercentageOverLowestPrice"
(Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
spotMaxPricePercentageOverLowestPrice,
Key -> TotalLocalStorageGBProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"TotalLocalStorageGB" (TotalLocalStorageGBProperty -> (Key, Value))
-> Maybe TotalLocalStorageGBProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe TotalLocalStorageGBProperty
totalLocalStorageGB,
Key -> VCpuCountProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"VCpuCount" (VCpuCountProperty -> (Key, Value))
-> Maybe VCpuCountProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe VCpuCountProperty
vCpuCount]))
instance Property "AcceleratorCount" InstanceRequirementsProperty where
type PropertyType "AcceleratorCount" InstanceRequirementsProperty = AcceleratorCountProperty
set :: PropertyType "AcceleratorCount" InstanceRequirementsProperty
-> InstanceRequirementsProperty -> InstanceRequirementsProperty
set PropertyType "AcceleratorCount" InstanceRequirementsProperty
newValue InstanceRequirementsProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: InstanceRequirementsProperty -> ()
acceleratorCount :: InstanceRequirementsProperty -> Maybe AcceleratorCountProperty
acceleratorManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorNames :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: InstanceRequirementsProperty
-> Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
allowedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
bareMetal :: InstanceRequirementsProperty -> Maybe (Value Text)
baselineEbsBandwidthMbps :: InstanceRequirementsProperty
-> Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: InstanceRequirementsProperty
-> Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: InstanceRequirementsProperty -> Maybe (Value Text)
cpuManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
excludedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
instanceGenerations :: InstanceRequirementsProperty -> Maybe (ValueList Text)
localStorage :: InstanceRequirementsProperty -> Maybe (Value Text)
localStorageTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
memoryGiBPerVCpu :: InstanceRequirementsProperty -> Maybe MemoryGiBPerVCpuProperty
memoryMiB :: InstanceRequirementsProperty -> Maybe MemoryMiBProperty
networkBandwidthGbps :: InstanceRequirementsProperty -> Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: InstanceRequirementsProperty -> Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
requireHibernateSupport :: InstanceRequirementsProperty -> Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
totalLocalStorageGB :: InstanceRequirementsProperty -> Maybe TotalLocalStorageGBProperty
vCpuCount :: InstanceRequirementsProperty -> Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
= InstanceRequirementsProperty
{acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorCount = AcceleratorCountProperty -> Maybe AcceleratorCountProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "AcceleratorCount" InstanceRequirementsProperty
AcceleratorCountProperty
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: ()
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
instance Property "AcceleratorManufacturers" InstanceRequirementsProperty where
type PropertyType "AcceleratorManufacturers" InstanceRequirementsProperty = ValueList Prelude.Text
set :: PropertyType
"AcceleratorManufacturers" InstanceRequirementsProperty
-> InstanceRequirementsProperty -> InstanceRequirementsProperty
set PropertyType
"AcceleratorManufacturers" InstanceRequirementsProperty
newValue InstanceRequirementsProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: InstanceRequirementsProperty -> ()
acceleratorCount :: InstanceRequirementsProperty -> Maybe AcceleratorCountProperty
acceleratorManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorNames :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: InstanceRequirementsProperty
-> Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
allowedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
bareMetal :: InstanceRequirementsProperty -> Maybe (Value Text)
baselineEbsBandwidthMbps :: InstanceRequirementsProperty
-> Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: InstanceRequirementsProperty
-> Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: InstanceRequirementsProperty -> Maybe (Value Text)
cpuManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
excludedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
instanceGenerations :: InstanceRequirementsProperty -> Maybe (ValueList Text)
localStorage :: InstanceRequirementsProperty -> Maybe (Value Text)
localStorageTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
memoryGiBPerVCpu :: InstanceRequirementsProperty -> Maybe MemoryGiBPerVCpuProperty
memoryMiB :: InstanceRequirementsProperty -> Maybe MemoryMiBProperty
networkBandwidthGbps :: InstanceRequirementsProperty -> Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: InstanceRequirementsProperty -> Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
requireHibernateSupport :: InstanceRequirementsProperty -> Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
totalLocalStorageGB :: InstanceRequirementsProperty -> Maybe TotalLocalStorageGBProperty
vCpuCount :: InstanceRequirementsProperty -> Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
= InstanceRequirementsProperty
{acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorManufacturers = ValueList Text -> Maybe (ValueList Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
"AcceleratorManufacturers" InstanceRequirementsProperty
ValueList Text
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
instance Property "AcceleratorNames" InstanceRequirementsProperty where
type PropertyType "AcceleratorNames" InstanceRequirementsProperty = ValueList Prelude.Text
set :: PropertyType "AcceleratorNames" InstanceRequirementsProperty
-> InstanceRequirementsProperty -> InstanceRequirementsProperty
set PropertyType "AcceleratorNames" InstanceRequirementsProperty
newValue InstanceRequirementsProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: InstanceRequirementsProperty -> ()
acceleratorCount :: InstanceRequirementsProperty -> Maybe AcceleratorCountProperty
acceleratorManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorNames :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: InstanceRequirementsProperty
-> Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
allowedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
bareMetal :: InstanceRequirementsProperty -> Maybe (Value Text)
baselineEbsBandwidthMbps :: InstanceRequirementsProperty
-> Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: InstanceRequirementsProperty
-> Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: InstanceRequirementsProperty -> Maybe (Value Text)
cpuManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
excludedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
instanceGenerations :: InstanceRequirementsProperty -> Maybe (ValueList Text)
localStorage :: InstanceRequirementsProperty -> Maybe (Value Text)
localStorageTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
memoryGiBPerVCpu :: InstanceRequirementsProperty -> Maybe MemoryGiBPerVCpuProperty
memoryMiB :: InstanceRequirementsProperty -> Maybe MemoryMiBProperty
networkBandwidthGbps :: InstanceRequirementsProperty -> Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: InstanceRequirementsProperty -> Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
requireHibernateSupport :: InstanceRequirementsProperty -> Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
totalLocalStorageGB :: InstanceRequirementsProperty -> Maybe TotalLocalStorageGBProperty
vCpuCount :: InstanceRequirementsProperty -> Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
= InstanceRequirementsProperty
{acceleratorNames :: Maybe (ValueList Text)
acceleratorNames = ValueList Text -> Maybe (ValueList Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "AcceleratorNames" InstanceRequirementsProperty
ValueList Text
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
instance Property "AcceleratorTotalMemoryMiB" InstanceRequirementsProperty where
type PropertyType "AcceleratorTotalMemoryMiB" InstanceRequirementsProperty = AcceleratorTotalMemoryMiBProperty
set :: PropertyType
"AcceleratorTotalMemoryMiB" InstanceRequirementsProperty
-> InstanceRequirementsProperty -> InstanceRequirementsProperty
set PropertyType
"AcceleratorTotalMemoryMiB" InstanceRequirementsProperty
newValue InstanceRequirementsProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: InstanceRequirementsProperty -> ()
acceleratorCount :: InstanceRequirementsProperty -> Maybe AcceleratorCountProperty
acceleratorManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorNames :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: InstanceRequirementsProperty
-> Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
allowedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
bareMetal :: InstanceRequirementsProperty -> Maybe (Value Text)
baselineEbsBandwidthMbps :: InstanceRequirementsProperty
-> Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: InstanceRequirementsProperty
-> Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: InstanceRequirementsProperty -> Maybe (Value Text)
cpuManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
excludedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
instanceGenerations :: InstanceRequirementsProperty -> Maybe (ValueList Text)
localStorage :: InstanceRequirementsProperty -> Maybe (Value Text)
localStorageTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
memoryGiBPerVCpu :: InstanceRequirementsProperty -> Maybe MemoryGiBPerVCpuProperty
memoryMiB :: InstanceRequirementsProperty -> Maybe MemoryMiBProperty
networkBandwidthGbps :: InstanceRequirementsProperty -> Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: InstanceRequirementsProperty -> Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
requireHibernateSupport :: InstanceRequirementsProperty -> Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
totalLocalStorageGB :: InstanceRequirementsProperty -> Maybe TotalLocalStorageGBProperty
vCpuCount :: InstanceRequirementsProperty -> Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
= InstanceRequirementsProperty
{acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTotalMemoryMiB = AcceleratorTotalMemoryMiBProperty
-> Maybe AcceleratorTotalMemoryMiBProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
"AcceleratorTotalMemoryMiB" InstanceRequirementsProperty
AcceleratorTotalMemoryMiBProperty
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
instance Property "AcceleratorTypes" InstanceRequirementsProperty where
type PropertyType "AcceleratorTypes" InstanceRequirementsProperty = ValueList Prelude.Text
set :: PropertyType "AcceleratorTypes" InstanceRequirementsProperty
-> InstanceRequirementsProperty -> InstanceRequirementsProperty
set PropertyType "AcceleratorTypes" InstanceRequirementsProperty
newValue InstanceRequirementsProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: InstanceRequirementsProperty -> ()
acceleratorCount :: InstanceRequirementsProperty -> Maybe AcceleratorCountProperty
acceleratorManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorNames :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: InstanceRequirementsProperty
-> Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
allowedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
bareMetal :: InstanceRequirementsProperty -> Maybe (Value Text)
baselineEbsBandwidthMbps :: InstanceRequirementsProperty
-> Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: InstanceRequirementsProperty
-> Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: InstanceRequirementsProperty -> Maybe (Value Text)
cpuManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
excludedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
instanceGenerations :: InstanceRequirementsProperty -> Maybe (ValueList Text)
localStorage :: InstanceRequirementsProperty -> Maybe (Value Text)
localStorageTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
memoryGiBPerVCpu :: InstanceRequirementsProperty -> Maybe MemoryGiBPerVCpuProperty
memoryMiB :: InstanceRequirementsProperty -> Maybe MemoryMiBProperty
networkBandwidthGbps :: InstanceRequirementsProperty -> Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: InstanceRequirementsProperty -> Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
requireHibernateSupport :: InstanceRequirementsProperty -> Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
totalLocalStorageGB :: InstanceRequirementsProperty -> Maybe TotalLocalStorageGBProperty
vCpuCount :: InstanceRequirementsProperty -> Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
= InstanceRequirementsProperty
{acceleratorTypes :: Maybe (ValueList Text)
acceleratorTypes = ValueList Text -> Maybe (ValueList Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "AcceleratorTypes" InstanceRequirementsProperty
ValueList Text
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
instance Property "AllowedInstanceTypes" InstanceRequirementsProperty where
type PropertyType "AllowedInstanceTypes" InstanceRequirementsProperty = ValueList Prelude.Text
set :: PropertyType "AllowedInstanceTypes" InstanceRequirementsProperty
-> InstanceRequirementsProperty -> InstanceRequirementsProperty
set PropertyType "AllowedInstanceTypes" InstanceRequirementsProperty
newValue InstanceRequirementsProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: InstanceRequirementsProperty -> ()
acceleratorCount :: InstanceRequirementsProperty -> Maybe AcceleratorCountProperty
acceleratorManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorNames :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: InstanceRequirementsProperty
-> Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
allowedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
bareMetal :: InstanceRequirementsProperty -> Maybe (Value Text)
baselineEbsBandwidthMbps :: InstanceRequirementsProperty
-> Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: InstanceRequirementsProperty
-> Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: InstanceRequirementsProperty -> Maybe (Value Text)
cpuManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
excludedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
instanceGenerations :: InstanceRequirementsProperty -> Maybe (ValueList Text)
localStorage :: InstanceRequirementsProperty -> Maybe (Value Text)
localStorageTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
memoryGiBPerVCpu :: InstanceRequirementsProperty -> Maybe MemoryGiBPerVCpuProperty
memoryMiB :: InstanceRequirementsProperty -> Maybe MemoryMiBProperty
networkBandwidthGbps :: InstanceRequirementsProperty -> Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: InstanceRequirementsProperty -> Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
requireHibernateSupport :: InstanceRequirementsProperty -> Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
totalLocalStorageGB :: InstanceRequirementsProperty -> Maybe TotalLocalStorageGBProperty
vCpuCount :: InstanceRequirementsProperty -> Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
= InstanceRequirementsProperty
{allowedInstanceTypes :: Maybe (ValueList Text)
allowedInstanceTypes = ValueList Text -> Maybe (ValueList Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "AllowedInstanceTypes" InstanceRequirementsProperty
ValueList Text
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
instance Property "BareMetal" InstanceRequirementsProperty where
type PropertyType "BareMetal" InstanceRequirementsProperty = Value Prelude.Text
set :: PropertyType "BareMetal" InstanceRequirementsProperty
-> InstanceRequirementsProperty -> InstanceRequirementsProperty
set PropertyType "BareMetal" InstanceRequirementsProperty
newValue InstanceRequirementsProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: InstanceRequirementsProperty -> ()
acceleratorCount :: InstanceRequirementsProperty -> Maybe AcceleratorCountProperty
acceleratorManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorNames :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: InstanceRequirementsProperty
-> Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
allowedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
bareMetal :: InstanceRequirementsProperty -> Maybe (Value Text)
baselineEbsBandwidthMbps :: InstanceRequirementsProperty
-> Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: InstanceRequirementsProperty
-> Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: InstanceRequirementsProperty -> Maybe (Value Text)
cpuManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
excludedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
instanceGenerations :: InstanceRequirementsProperty -> Maybe (ValueList Text)
localStorage :: InstanceRequirementsProperty -> Maybe (Value Text)
localStorageTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
memoryGiBPerVCpu :: InstanceRequirementsProperty -> Maybe MemoryGiBPerVCpuProperty
memoryMiB :: InstanceRequirementsProperty -> Maybe MemoryMiBProperty
networkBandwidthGbps :: InstanceRequirementsProperty -> Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: InstanceRequirementsProperty -> Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
requireHibernateSupport :: InstanceRequirementsProperty -> Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
totalLocalStorageGB :: InstanceRequirementsProperty -> Maybe TotalLocalStorageGBProperty
vCpuCount :: InstanceRequirementsProperty -> Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
= InstanceRequirementsProperty
{bareMetal :: Maybe (Value Text)
bareMetal = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "BareMetal" InstanceRequirementsProperty
Value Text
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
instance Property "BaselineEbsBandwidthMbps" InstanceRequirementsProperty where
type PropertyType "BaselineEbsBandwidthMbps" InstanceRequirementsProperty = BaselineEbsBandwidthMbpsProperty
set :: PropertyType
"BaselineEbsBandwidthMbps" InstanceRequirementsProperty
-> InstanceRequirementsProperty -> InstanceRequirementsProperty
set PropertyType
"BaselineEbsBandwidthMbps" InstanceRequirementsProperty
newValue InstanceRequirementsProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: InstanceRequirementsProperty -> ()
acceleratorCount :: InstanceRequirementsProperty -> Maybe AcceleratorCountProperty
acceleratorManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorNames :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: InstanceRequirementsProperty
-> Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
allowedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
bareMetal :: InstanceRequirementsProperty -> Maybe (Value Text)
baselineEbsBandwidthMbps :: InstanceRequirementsProperty
-> Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: InstanceRequirementsProperty
-> Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: InstanceRequirementsProperty -> Maybe (Value Text)
cpuManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
excludedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
instanceGenerations :: InstanceRequirementsProperty -> Maybe (ValueList Text)
localStorage :: InstanceRequirementsProperty -> Maybe (Value Text)
localStorageTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
memoryGiBPerVCpu :: InstanceRequirementsProperty -> Maybe MemoryGiBPerVCpuProperty
memoryMiB :: InstanceRequirementsProperty -> Maybe MemoryMiBProperty
networkBandwidthGbps :: InstanceRequirementsProperty -> Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: InstanceRequirementsProperty -> Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
requireHibernateSupport :: InstanceRequirementsProperty -> Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
totalLocalStorageGB :: InstanceRequirementsProperty -> Maybe TotalLocalStorageGBProperty
vCpuCount :: InstanceRequirementsProperty -> Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
= InstanceRequirementsProperty
{baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselineEbsBandwidthMbps = BaselineEbsBandwidthMbpsProperty
-> Maybe BaselineEbsBandwidthMbpsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
"BaselineEbsBandwidthMbps" InstanceRequirementsProperty
BaselineEbsBandwidthMbpsProperty
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
instance Property "BaselinePerformanceFactors" InstanceRequirementsProperty where
type PropertyType "BaselinePerformanceFactors" InstanceRequirementsProperty = BaselinePerformanceFactorsProperty
set :: PropertyType
"BaselinePerformanceFactors" InstanceRequirementsProperty
-> InstanceRequirementsProperty -> InstanceRequirementsProperty
set PropertyType
"BaselinePerformanceFactors" InstanceRequirementsProperty
newValue InstanceRequirementsProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: InstanceRequirementsProperty -> ()
acceleratorCount :: InstanceRequirementsProperty -> Maybe AcceleratorCountProperty
acceleratorManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorNames :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: InstanceRequirementsProperty
-> Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
allowedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
bareMetal :: InstanceRequirementsProperty -> Maybe (Value Text)
baselineEbsBandwidthMbps :: InstanceRequirementsProperty
-> Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: InstanceRequirementsProperty
-> Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: InstanceRequirementsProperty -> Maybe (Value Text)
cpuManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
excludedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
instanceGenerations :: InstanceRequirementsProperty -> Maybe (ValueList Text)
localStorage :: InstanceRequirementsProperty -> Maybe (Value Text)
localStorageTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
memoryGiBPerVCpu :: InstanceRequirementsProperty -> Maybe MemoryGiBPerVCpuProperty
memoryMiB :: InstanceRequirementsProperty -> Maybe MemoryMiBProperty
networkBandwidthGbps :: InstanceRequirementsProperty -> Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: InstanceRequirementsProperty -> Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
requireHibernateSupport :: InstanceRequirementsProperty -> Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
totalLocalStorageGB :: InstanceRequirementsProperty -> Maybe TotalLocalStorageGBProperty
vCpuCount :: InstanceRequirementsProperty -> Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
= InstanceRequirementsProperty
{baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
baselinePerformanceFactors = BaselinePerformanceFactorsProperty
-> Maybe BaselinePerformanceFactorsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
"BaselinePerformanceFactors" InstanceRequirementsProperty
BaselinePerformanceFactorsProperty
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
instance Property "BurstablePerformance" InstanceRequirementsProperty where
type PropertyType "BurstablePerformance" InstanceRequirementsProperty = Value Prelude.Text
set :: PropertyType "BurstablePerformance" InstanceRequirementsProperty
-> InstanceRequirementsProperty -> InstanceRequirementsProperty
set PropertyType "BurstablePerformance" InstanceRequirementsProperty
newValue InstanceRequirementsProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: InstanceRequirementsProperty -> ()
acceleratorCount :: InstanceRequirementsProperty -> Maybe AcceleratorCountProperty
acceleratorManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorNames :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: InstanceRequirementsProperty
-> Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
allowedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
bareMetal :: InstanceRequirementsProperty -> Maybe (Value Text)
baselineEbsBandwidthMbps :: InstanceRequirementsProperty
-> Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: InstanceRequirementsProperty
-> Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: InstanceRequirementsProperty -> Maybe (Value Text)
cpuManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
excludedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
instanceGenerations :: InstanceRequirementsProperty -> Maybe (ValueList Text)
localStorage :: InstanceRequirementsProperty -> Maybe (Value Text)
localStorageTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
memoryGiBPerVCpu :: InstanceRequirementsProperty -> Maybe MemoryGiBPerVCpuProperty
memoryMiB :: InstanceRequirementsProperty -> Maybe MemoryMiBProperty
networkBandwidthGbps :: InstanceRequirementsProperty -> Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: InstanceRequirementsProperty -> Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
requireHibernateSupport :: InstanceRequirementsProperty -> Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
totalLocalStorageGB :: InstanceRequirementsProperty -> Maybe TotalLocalStorageGBProperty
vCpuCount :: InstanceRequirementsProperty -> Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
= InstanceRequirementsProperty
{burstablePerformance :: Maybe (Value Text)
burstablePerformance = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "BurstablePerformance" InstanceRequirementsProperty
Value Text
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
instance Property "CpuManufacturers" InstanceRequirementsProperty where
type PropertyType "CpuManufacturers" InstanceRequirementsProperty = ValueList Prelude.Text
set :: PropertyType "CpuManufacturers" InstanceRequirementsProperty
-> InstanceRequirementsProperty -> InstanceRequirementsProperty
set PropertyType "CpuManufacturers" InstanceRequirementsProperty
newValue InstanceRequirementsProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: InstanceRequirementsProperty -> ()
acceleratorCount :: InstanceRequirementsProperty -> Maybe AcceleratorCountProperty
acceleratorManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorNames :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: InstanceRequirementsProperty
-> Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
allowedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
bareMetal :: InstanceRequirementsProperty -> Maybe (Value Text)
baselineEbsBandwidthMbps :: InstanceRequirementsProperty
-> Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: InstanceRequirementsProperty
-> Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: InstanceRequirementsProperty -> Maybe (Value Text)
cpuManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
excludedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
instanceGenerations :: InstanceRequirementsProperty -> Maybe (ValueList Text)
localStorage :: InstanceRequirementsProperty -> Maybe (Value Text)
localStorageTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
memoryGiBPerVCpu :: InstanceRequirementsProperty -> Maybe MemoryGiBPerVCpuProperty
memoryMiB :: InstanceRequirementsProperty -> Maybe MemoryMiBProperty
networkBandwidthGbps :: InstanceRequirementsProperty -> Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: InstanceRequirementsProperty -> Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
requireHibernateSupport :: InstanceRequirementsProperty -> Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
totalLocalStorageGB :: InstanceRequirementsProperty -> Maybe TotalLocalStorageGBProperty
vCpuCount :: InstanceRequirementsProperty -> Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
= InstanceRequirementsProperty
{cpuManufacturers :: Maybe (ValueList Text)
cpuManufacturers = ValueList Text -> Maybe (ValueList Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "CpuManufacturers" InstanceRequirementsProperty
ValueList Text
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
instance Property "ExcludedInstanceTypes" InstanceRequirementsProperty where
type PropertyType "ExcludedInstanceTypes" InstanceRequirementsProperty = ValueList Prelude.Text
set :: PropertyType "ExcludedInstanceTypes" InstanceRequirementsProperty
-> InstanceRequirementsProperty -> InstanceRequirementsProperty
set PropertyType "ExcludedInstanceTypes" InstanceRequirementsProperty
newValue InstanceRequirementsProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: InstanceRequirementsProperty -> ()
acceleratorCount :: InstanceRequirementsProperty -> Maybe AcceleratorCountProperty
acceleratorManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorNames :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: InstanceRequirementsProperty
-> Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
allowedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
bareMetal :: InstanceRequirementsProperty -> Maybe (Value Text)
baselineEbsBandwidthMbps :: InstanceRequirementsProperty
-> Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: InstanceRequirementsProperty
-> Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: InstanceRequirementsProperty -> Maybe (Value Text)
cpuManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
excludedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
instanceGenerations :: InstanceRequirementsProperty -> Maybe (ValueList Text)
localStorage :: InstanceRequirementsProperty -> Maybe (Value Text)
localStorageTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
memoryGiBPerVCpu :: InstanceRequirementsProperty -> Maybe MemoryGiBPerVCpuProperty
memoryMiB :: InstanceRequirementsProperty -> Maybe MemoryMiBProperty
networkBandwidthGbps :: InstanceRequirementsProperty -> Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: InstanceRequirementsProperty -> Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
requireHibernateSupport :: InstanceRequirementsProperty -> Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
totalLocalStorageGB :: InstanceRequirementsProperty -> Maybe TotalLocalStorageGBProperty
vCpuCount :: InstanceRequirementsProperty -> Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
= InstanceRequirementsProperty
{excludedInstanceTypes :: Maybe (ValueList Text)
excludedInstanceTypes = ValueList Text -> Maybe (ValueList Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ExcludedInstanceTypes" InstanceRequirementsProperty
ValueList Text
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
instance Property "InstanceGenerations" InstanceRequirementsProperty where
type PropertyType "InstanceGenerations" InstanceRequirementsProperty = ValueList Prelude.Text
set :: PropertyType "InstanceGenerations" InstanceRequirementsProperty
-> InstanceRequirementsProperty -> InstanceRequirementsProperty
set PropertyType "InstanceGenerations" InstanceRequirementsProperty
newValue InstanceRequirementsProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: InstanceRequirementsProperty -> ()
acceleratorCount :: InstanceRequirementsProperty -> Maybe AcceleratorCountProperty
acceleratorManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorNames :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: InstanceRequirementsProperty
-> Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
allowedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
bareMetal :: InstanceRequirementsProperty -> Maybe (Value Text)
baselineEbsBandwidthMbps :: InstanceRequirementsProperty
-> Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: InstanceRequirementsProperty
-> Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: InstanceRequirementsProperty -> Maybe (Value Text)
cpuManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
excludedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
instanceGenerations :: InstanceRequirementsProperty -> Maybe (ValueList Text)
localStorage :: InstanceRequirementsProperty -> Maybe (Value Text)
localStorageTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
memoryGiBPerVCpu :: InstanceRequirementsProperty -> Maybe MemoryGiBPerVCpuProperty
memoryMiB :: InstanceRequirementsProperty -> Maybe MemoryMiBProperty
networkBandwidthGbps :: InstanceRequirementsProperty -> Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: InstanceRequirementsProperty -> Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
requireHibernateSupport :: InstanceRequirementsProperty -> Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
totalLocalStorageGB :: InstanceRequirementsProperty -> Maybe TotalLocalStorageGBProperty
vCpuCount :: InstanceRequirementsProperty -> Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
= InstanceRequirementsProperty
{instanceGenerations :: Maybe (ValueList Text)
instanceGenerations = ValueList Text -> Maybe (ValueList Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "InstanceGenerations" InstanceRequirementsProperty
ValueList Text
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
instance Property "LocalStorage" InstanceRequirementsProperty where
type PropertyType "LocalStorage" InstanceRequirementsProperty = Value Prelude.Text
set :: PropertyType "LocalStorage" InstanceRequirementsProperty
-> InstanceRequirementsProperty -> InstanceRequirementsProperty
set PropertyType "LocalStorage" InstanceRequirementsProperty
newValue InstanceRequirementsProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: InstanceRequirementsProperty -> ()
acceleratorCount :: InstanceRequirementsProperty -> Maybe AcceleratorCountProperty
acceleratorManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorNames :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: InstanceRequirementsProperty
-> Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
allowedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
bareMetal :: InstanceRequirementsProperty -> Maybe (Value Text)
baselineEbsBandwidthMbps :: InstanceRequirementsProperty
-> Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: InstanceRequirementsProperty
-> Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: InstanceRequirementsProperty -> Maybe (Value Text)
cpuManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
excludedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
instanceGenerations :: InstanceRequirementsProperty -> Maybe (ValueList Text)
localStorage :: InstanceRequirementsProperty -> Maybe (Value Text)
localStorageTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
memoryGiBPerVCpu :: InstanceRequirementsProperty -> Maybe MemoryGiBPerVCpuProperty
memoryMiB :: InstanceRequirementsProperty -> Maybe MemoryMiBProperty
networkBandwidthGbps :: InstanceRequirementsProperty -> Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: InstanceRequirementsProperty -> Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
requireHibernateSupport :: InstanceRequirementsProperty -> Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
totalLocalStorageGB :: InstanceRequirementsProperty -> Maybe TotalLocalStorageGBProperty
vCpuCount :: InstanceRequirementsProperty -> Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
= InstanceRequirementsProperty
{localStorage :: Maybe (Value Text)
localStorage = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "LocalStorage" InstanceRequirementsProperty
Value Text
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
instance Property "LocalStorageTypes" InstanceRequirementsProperty where
type PropertyType "LocalStorageTypes" InstanceRequirementsProperty = ValueList Prelude.Text
set :: PropertyType "LocalStorageTypes" InstanceRequirementsProperty
-> InstanceRequirementsProperty -> InstanceRequirementsProperty
set PropertyType "LocalStorageTypes" InstanceRequirementsProperty
newValue InstanceRequirementsProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: InstanceRequirementsProperty -> ()
acceleratorCount :: InstanceRequirementsProperty -> Maybe AcceleratorCountProperty
acceleratorManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorNames :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: InstanceRequirementsProperty
-> Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
allowedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
bareMetal :: InstanceRequirementsProperty -> Maybe (Value Text)
baselineEbsBandwidthMbps :: InstanceRequirementsProperty
-> Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: InstanceRequirementsProperty
-> Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: InstanceRequirementsProperty -> Maybe (Value Text)
cpuManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
excludedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
instanceGenerations :: InstanceRequirementsProperty -> Maybe (ValueList Text)
localStorage :: InstanceRequirementsProperty -> Maybe (Value Text)
localStorageTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
memoryGiBPerVCpu :: InstanceRequirementsProperty -> Maybe MemoryGiBPerVCpuProperty
memoryMiB :: InstanceRequirementsProperty -> Maybe MemoryMiBProperty
networkBandwidthGbps :: InstanceRequirementsProperty -> Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: InstanceRequirementsProperty -> Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
requireHibernateSupport :: InstanceRequirementsProperty -> Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
totalLocalStorageGB :: InstanceRequirementsProperty -> Maybe TotalLocalStorageGBProperty
vCpuCount :: InstanceRequirementsProperty -> Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
= InstanceRequirementsProperty
{localStorageTypes :: Maybe (ValueList Text)
localStorageTypes = ValueList Text -> Maybe (ValueList Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "LocalStorageTypes" InstanceRequirementsProperty
ValueList Text
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
instance Property "MaxSpotPriceAsPercentageOfOptimalOnDemandPrice" InstanceRequirementsProperty where
type PropertyType "MaxSpotPriceAsPercentageOfOptimalOnDemandPrice" InstanceRequirementsProperty = Value Prelude.Integer
set :: PropertyType
"MaxSpotPriceAsPercentageOfOptimalOnDemandPrice"
InstanceRequirementsProperty
-> InstanceRequirementsProperty -> InstanceRequirementsProperty
set PropertyType
"MaxSpotPriceAsPercentageOfOptimalOnDemandPrice"
InstanceRequirementsProperty
newValue InstanceRequirementsProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: InstanceRequirementsProperty -> ()
acceleratorCount :: InstanceRequirementsProperty -> Maybe AcceleratorCountProperty
acceleratorManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorNames :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: InstanceRequirementsProperty
-> Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
allowedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
bareMetal :: InstanceRequirementsProperty -> Maybe (Value Text)
baselineEbsBandwidthMbps :: InstanceRequirementsProperty
-> Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: InstanceRequirementsProperty
-> Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: InstanceRequirementsProperty -> Maybe (Value Text)
cpuManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
excludedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
instanceGenerations :: InstanceRequirementsProperty -> Maybe (ValueList Text)
localStorage :: InstanceRequirementsProperty -> Maybe (Value Text)
localStorageTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
memoryGiBPerVCpu :: InstanceRequirementsProperty -> Maybe MemoryGiBPerVCpuProperty
memoryMiB :: InstanceRequirementsProperty -> Maybe MemoryMiBProperty
networkBandwidthGbps :: InstanceRequirementsProperty -> Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: InstanceRequirementsProperty -> Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
requireHibernateSupport :: InstanceRequirementsProperty -> Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
totalLocalStorageGB :: InstanceRequirementsProperty -> Maybe TotalLocalStorageGBProperty
vCpuCount :: InstanceRequirementsProperty -> Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
= InstanceRequirementsProperty
{maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice = Value Integer -> Maybe (Value Integer)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure
PropertyType
"MaxSpotPriceAsPercentageOfOptimalOnDemandPrice"
InstanceRequirementsProperty
Value Integer
newValue,
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
instance Property "MemoryGiBPerVCpu" InstanceRequirementsProperty where
type PropertyType "MemoryGiBPerVCpu" InstanceRequirementsProperty = MemoryGiBPerVCpuProperty
set :: PropertyType "MemoryGiBPerVCpu" InstanceRequirementsProperty
-> InstanceRequirementsProperty -> InstanceRequirementsProperty
set PropertyType "MemoryGiBPerVCpu" InstanceRequirementsProperty
newValue InstanceRequirementsProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: InstanceRequirementsProperty -> ()
acceleratorCount :: InstanceRequirementsProperty -> Maybe AcceleratorCountProperty
acceleratorManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorNames :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: InstanceRequirementsProperty
-> Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
allowedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
bareMetal :: InstanceRequirementsProperty -> Maybe (Value Text)
baselineEbsBandwidthMbps :: InstanceRequirementsProperty
-> Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: InstanceRequirementsProperty
-> Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: InstanceRequirementsProperty -> Maybe (Value Text)
cpuManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
excludedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
instanceGenerations :: InstanceRequirementsProperty -> Maybe (ValueList Text)
localStorage :: InstanceRequirementsProperty -> Maybe (Value Text)
localStorageTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
memoryGiBPerVCpu :: InstanceRequirementsProperty -> Maybe MemoryGiBPerVCpuProperty
memoryMiB :: InstanceRequirementsProperty -> Maybe MemoryMiBProperty
networkBandwidthGbps :: InstanceRequirementsProperty -> Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: InstanceRequirementsProperty -> Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
requireHibernateSupport :: InstanceRequirementsProperty -> Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
totalLocalStorageGB :: InstanceRequirementsProperty -> Maybe TotalLocalStorageGBProperty
vCpuCount :: InstanceRequirementsProperty -> Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
= InstanceRequirementsProperty
{memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryGiBPerVCpu = MemoryGiBPerVCpuProperty -> Maybe MemoryGiBPerVCpuProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "MemoryGiBPerVCpu" InstanceRequirementsProperty
MemoryGiBPerVCpuProperty
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
instance Property "MemoryMiB" InstanceRequirementsProperty where
type PropertyType "MemoryMiB" InstanceRequirementsProperty = MemoryMiBProperty
set :: PropertyType "MemoryMiB" InstanceRequirementsProperty
-> InstanceRequirementsProperty -> InstanceRequirementsProperty
set PropertyType "MemoryMiB" InstanceRequirementsProperty
newValue InstanceRequirementsProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: InstanceRequirementsProperty -> ()
acceleratorCount :: InstanceRequirementsProperty -> Maybe AcceleratorCountProperty
acceleratorManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorNames :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: InstanceRequirementsProperty
-> Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
allowedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
bareMetal :: InstanceRequirementsProperty -> Maybe (Value Text)
baselineEbsBandwidthMbps :: InstanceRequirementsProperty
-> Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: InstanceRequirementsProperty
-> Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: InstanceRequirementsProperty -> Maybe (Value Text)
cpuManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
excludedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
instanceGenerations :: InstanceRequirementsProperty -> Maybe (ValueList Text)
localStorage :: InstanceRequirementsProperty -> Maybe (Value Text)
localStorageTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
memoryGiBPerVCpu :: InstanceRequirementsProperty -> Maybe MemoryGiBPerVCpuProperty
memoryMiB :: InstanceRequirementsProperty -> Maybe MemoryMiBProperty
networkBandwidthGbps :: InstanceRequirementsProperty -> Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: InstanceRequirementsProperty -> Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
requireHibernateSupport :: InstanceRequirementsProperty -> Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
totalLocalStorageGB :: InstanceRequirementsProperty -> Maybe TotalLocalStorageGBProperty
vCpuCount :: InstanceRequirementsProperty -> Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
= InstanceRequirementsProperty
{memoryMiB :: Maybe MemoryMiBProperty
memoryMiB = MemoryMiBProperty -> Maybe MemoryMiBProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "MemoryMiB" InstanceRequirementsProperty
MemoryMiBProperty
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
instance Property "NetworkBandwidthGbps" InstanceRequirementsProperty where
type PropertyType "NetworkBandwidthGbps" InstanceRequirementsProperty = NetworkBandwidthGbpsProperty
set :: PropertyType "NetworkBandwidthGbps" InstanceRequirementsProperty
-> InstanceRequirementsProperty -> InstanceRequirementsProperty
set PropertyType "NetworkBandwidthGbps" InstanceRequirementsProperty
newValue InstanceRequirementsProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: InstanceRequirementsProperty -> ()
acceleratorCount :: InstanceRequirementsProperty -> Maybe AcceleratorCountProperty
acceleratorManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorNames :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: InstanceRequirementsProperty
-> Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
allowedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
bareMetal :: InstanceRequirementsProperty -> Maybe (Value Text)
baselineEbsBandwidthMbps :: InstanceRequirementsProperty
-> Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: InstanceRequirementsProperty
-> Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: InstanceRequirementsProperty -> Maybe (Value Text)
cpuManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
excludedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
instanceGenerations :: InstanceRequirementsProperty -> Maybe (ValueList Text)
localStorage :: InstanceRequirementsProperty -> Maybe (Value Text)
localStorageTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
memoryGiBPerVCpu :: InstanceRequirementsProperty -> Maybe MemoryGiBPerVCpuProperty
memoryMiB :: InstanceRequirementsProperty -> Maybe MemoryMiBProperty
networkBandwidthGbps :: InstanceRequirementsProperty -> Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: InstanceRequirementsProperty -> Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
requireHibernateSupport :: InstanceRequirementsProperty -> Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
totalLocalStorageGB :: InstanceRequirementsProperty -> Maybe TotalLocalStorageGBProperty
vCpuCount :: InstanceRequirementsProperty -> Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
= InstanceRequirementsProperty
{networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkBandwidthGbps = NetworkBandwidthGbpsProperty -> Maybe NetworkBandwidthGbpsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "NetworkBandwidthGbps" InstanceRequirementsProperty
NetworkBandwidthGbpsProperty
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
instance Property "NetworkInterfaceCount" InstanceRequirementsProperty where
type PropertyType "NetworkInterfaceCount" InstanceRequirementsProperty = NetworkInterfaceCountProperty
set :: PropertyType "NetworkInterfaceCount" InstanceRequirementsProperty
-> InstanceRequirementsProperty -> InstanceRequirementsProperty
set PropertyType "NetworkInterfaceCount" InstanceRequirementsProperty
newValue InstanceRequirementsProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: InstanceRequirementsProperty -> ()
acceleratorCount :: InstanceRequirementsProperty -> Maybe AcceleratorCountProperty
acceleratorManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorNames :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: InstanceRequirementsProperty
-> Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
allowedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
bareMetal :: InstanceRequirementsProperty -> Maybe (Value Text)
baselineEbsBandwidthMbps :: InstanceRequirementsProperty
-> Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: InstanceRequirementsProperty
-> Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: InstanceRequirementsProperty -> Maybe (Value Text)
cpuManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
excludedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
instanceGenerations :: InstanceRequirementsProperty -> Maybe (ValueList Text)
localStorage :: InstanceRequirementsProperty -> Maybe (Value Text)
localStorageTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
memoryGiBPerVCpu :: InstanceRequirementsProperty -> Maybe MemoryGiBPerVCpuProperty
memoryMiB :: InstanceRequirementsProperty -> Maybe MemoryMiBProperty
networkBandwidthGbps :: InstanceRequirementsProperty -> Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: InstanceRequirementsProperty -> Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
requireHibernateSupport :: InstanceRequirementsProperty -> Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
totalLocalStorageGB :: InstanceRequirementsProperty -> Maybe TotalLocalStorageGBProperty
vCpuCount :: InstanceRequirementsProperty -> Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
= InstanceRequirementsProperty
{networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
networkInterfaceCount = NetworkInterfaceCountProperty
-> Maybe NetworkInterfaceCountProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "NetworkInterfaceCount" InstanceRequirementsProperty
NetworkInterfaceCountProperty
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
instance Property "OnDemandMaxPricePercentageOverLowestPrice" InstanceRequirementsProperty where
type PropertyType "OnDemandMaxPricePercentageOverLowestPrice" InstanceRequirementsProperty = Value Prelude.Integer
set :: PropertyType
"OnDemandMaxPricePercentageOverLowestPrice"
InstanceRequirementsProperty
-> InstanceRequirementsProperty -> InstanceRequirementsProperty
set PropertyType
"OnDemandMaxPricePercentageOverLowestPrice"
InstanceRequirementsProperty
newValue InstanceRequirementsProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: InstanceRequirementsProperty -> ()
acceleratorCount :: InstanceRequirementsProperty -> Maybe AcceleratorCountProperty
acceleratorManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorNames :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: InstanceRequirementsProperty
-> Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
allowedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
bareMetal :: InstanceRequirementsProperty -> Maybe (Value Text)
baselineEbsBandwidthMbps :: InstanceRequirementsProperty
-> Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: InstanceRequirementsProperty
-> Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: InstanceRequirementsProperty -> Maybe (Value Text)
cpuManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
excludedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
instanceGenerations :: InstanceRequirementsProperty -> Maybe (ValueList Text)
localStorage :: InstanceRequirementsProperty -> Maybe (Value Text)
localStorageTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
memoryGiBPerVCpu :: InstanceRequirementsProperty -> Maybe MemoryGiBPerVCpuProperty
memoryMiB :: InstanceRequirementsProperty -> Maybe MemoryMiBProperty
networkBandwidthGbps :: InstanceRequirementsProperty -> Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: InstanceRequirementsProperty -> Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
requireHibernateSupport :: InstanceRequirementsProperty -> Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
totalLocalStorageGB :: InstanceRequirementsProperty -> Maybe TotalLocalStorageGBProperty
vCpuCount :: InstanceRequirementsProperty -> Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
= InstanceRequirementsProperty
{onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
onDemandMaxPricePercentageOverLowestPrice = Value Integer -> Maybe (Value Integer)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
"OnDemandMaxPricePercentageOverLowestPrice"
InstanceRequirementsProperty
Value Integer
newValue,
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
instance Property "RequireHibernateSupport" InstanceRequirementsProperty where
type PropertyType "RequireHibernateSupport" InstanceRequirementsProperty = Value Prelude.Bool
set :: PropertyType "RequireHibernateSupport" InstanceRequirementsProperty
-> InstanceRequirementsProperty -> InstanceRequirementsProperty
set PropertyType "RequireHibernateSupport" InstanceRequirementsProperty
newValue InstanceRequirementsProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: InstanceRequirementsProperty -> ()
acceleratorCount :: InstanceRequirementsProperty -> Maybe AcceleratorCountProperty
acceleratorManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorNames :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: InstanceRequirementsProperty
-> Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
allowedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
bareMetal :: InstanceRequirementsProperty -> Maybe (Value Text)
baselineEbsBandwidthMbps :: InstanceRequirementsProperty
-> Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: InstanceRequirementsProperty
-> Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: InstanceRequirementsProperty -> Maybe (Value Text)
cpuManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
excludedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
instanceGenerations :: InstanceRequirementsProperty -> Maybe (ValueList Text)
localStorage :: InstanceRequirementsProperty -> Maybe (Value Text)
localStorageTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
memoryGiBPerVCpu :: InstanceRequirementsProperty -> Maybe MemoryGiBPerVCpuProperty
memoryMiB :: InstanceRequirementsProperty -> Maybe MemoryMiBProperty
networkBandwidthGbps :: InstanceRequirementsProperty -> Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: InstanceRequirementsProperty -> Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
requireHibernateSupport :: InstanceRequirementsProperty -> Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
totalLocalStorageGB :: InstanceRequirementsProperty -> Maybe TotalLocalStorageGBProperty
vCpuCount :: InstanceRequirementsProperty -> Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
= InstanceRequirementsProperty
{requireHibernateSupport :: Maybe (Value Bool)
requireHibernateSupport = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "RequireHibernateSupport" InstanceRequirementsProperty
Value Bool
newValue, Maybe (ValueList Text)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
instance Property "SpotMaxPricePercentageOverLowestPrice" InstanceRequirementsProperty where
type PropertyType "SpotMaxPricePercentageOverLowestPrice" InstanceRequirementsProperty = Value Prelude.Integer
set :: PropertyType
"SpotMaxPricePercentageOverLowestPrice"
InstanceRequirementsProperty
-> InstanceRequirementsProperty -> InstanceRequirementsProperty
set PropertyType
"SpotMaxPricePercentageOverLowestPrice"
InstanceRequirementsProperty
newValue InstanceRequirementsProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: InstanceRequirementsProperty -> ()
acceleratorCount :: InstanceRequirementsProperty -> Maybe AcceleratorCountProperty
acceleratorManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorNames :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: InstanceRequirementsProperty
-> Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
allowedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
bareMetal :: InstanceRequirementsProperty -> Maybe (Value Text)
baselineEbsBandwidthMbps :: InstanceRequirementsProperty
-> Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: InstanceRequirementsProperty
-> Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: InstanceRequirementsProperty -> Maybe (Value Text)
cpuManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
excludedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
instanceGenerations :: InstanceRequirementsProperty -> Maybe (ValueList Text)
localStorage :: InstanceRequirementsProperty -> Maybe (Value Text)
localStorageTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
memoryGiBPerVCpu :: InstanceRequirementsProperty -> Maybe MemoryGiBPerVCpuProperty
memoryMiB :: InstanceRequirementsProperty -> Maybe MemoryMiBProperty
networkBandwidthGbps :: InstanceRequirementsProperty -> Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: InstanceRequirementsProperty -> Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
requireHibernateSupport :: InstanceRequirementsProperty -> Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
totalLocalStorageGB :: InstanceRequirementsProperty -> Maybe TotalLocalStorageGBProperty
vCpuCount :: InstanceRequirementsProperty -> Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
= InstanceRequirementsProperty
{spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
spotMaxPricePercentageOverLowestPrice = Value Integer -> Maybe (Value Integer)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
"SpotMaxPricePercentageOverLowestPrice"
InstanceRequirementsProperty
Value Integer
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
instance Property "TotalLocalStorageGB" InstanceRequirementsProperty where
type PropertyType "TotalLocalStorageGB" InstanceRequirementsProperty = TotalLocalStorageGBProperty
set :: PropertyType "TotalLocalStorageGB" InstanceRequirementsProperty
-> InstanceRequirementsProperty -> InstanceRequirementsProperty
set PropertyType "TotalLocalStorageGB" InstanceRequirementsProperty
newValue InstanceRequirementsProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: InstanceRequirementsProperty -> ()
acceleratorCount :: InstanceRequirementsProperty -> Maybe AcceleratorCountProperty
acceleratorManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorNames :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: InstanceRequirementsProperty
-> Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
allowedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
bareMetal :: InstanceRequirementsProperty -> Maybe (Value Text)
baselineEbsBandwidthMbps :: InstanceRequirementsProperty
-> Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: InstanceRequirementsProperty
-> Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: InstanceRequirementsProperty -> Maybe (Value Text)
cpuManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
excludedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
instanceGenerations :: InstanceRequirementsProperty -> Maybe (ValueList Text)
localStorage :: InstanceRequirementsProperty -> Maybe (Value Text)
localStorageTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
memoryGiBPerVCpu :: InstanceRequirementsProperty -> Maybe MemoryGiBPerVCpuProperty
memoryMiB :: InstanceRequirementsProperty -> Maybe MemoryMiBProperty
networkBandwidthGbps :: InstanceRequirementsProperty -> Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: InstanceRequirementsProperty -> Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
requireHibernateSupport :: InstanceRequirementsProperty -> Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
totalLocalStorageGB :: InstanceRequirementsProperty -> Maybe TotalLocalStorageGBProperty
vCpuCount :: InstanceRequirementsProperty -> Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
= InstanceRequirementsProperty
{totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
totalLocalStorageGB = TotalLocalStorageGBProperty -> Maybe TotalLocalStorageGBProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "TotalLocalStorageGB" InstanceRequirementsProperty
TotalLocalStorageGBProperty
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
vCpuCount :: Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
vCpuCount :: Maybe VCpuCountProperty
..}
instance Property "VCpuCount" InstanceRequirementsProperty where
type PropertyType "VCpuCount" InstanceRequirementsProperty = VCpuCountProperty
set :: PropertyType "VCpuCount" InstanceRequirementsProperty
-> InstanceRequirementsProperty -> InstanceRequirementsProperty
set PropertyType "VCpuCount" InstanceRequirementsProperty
newValue InstanceRequirementsProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
Maybe VCpuCountProperty
()
haddock_workaround_ :: InstanceRequirementsProperty -> ()
acceleratorCount :: InstanceRequirementsProperty -> Maybe AcceleratorCountProperty
acceleratorManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorNames :: InstanceRequirementsProperty -> Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: InstanceRequirementsProperty
-> Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
allowedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
bareMetal :: InstanceRequirementsProperty -> Maybe (Value Text)
baselineEbsBandwidthMbps :: InstanceRequirementsProperty
-> Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: InstanceRequirementsProperty
-> Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: InstanceRequirementsProperty -> Maybe (Value Text)
cpuManufacturers :: InstanceRequirementsProperty -> Maybe (ValueList Text)
excludedInstanceTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
instanceGenerations :: InstanceRequirementsProperty -> Maybe (ValueList Text)
localStorage :: InstanceRequirementsProperty -> Maybe (Value Text)
localStorageTypes :: InstanceRequirementsProperty -> Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
memoryGiBPerVCpu :: InstanceRequirementsProperty -> Maybe MemoryGiBPerVCpuProperty
memoryMiB :: InstanceRequirementsProperty -> Maybe MemoryMiBProperty
networkBandwidthGbps :: InstanceRequirementsProperty -> Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: InstanceRequirementsProperty -> Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
requireHibernateSupport :: InstanceRequirementsProperty -> Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: InstanceRequirementsProperty -> Maybe (Value Integer)
totalLocalStorageGB :: InstanceRequirementsProperty -> Maybe TotalLocalStorageGBProperty
vCpuCount :: InstanceRequirementsProperty -> Maybe VCpuCountProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
vCpuCount :: Maybe VCpuCountProperty
..}
= InstanceRequirementsProperty
{vCpuCount :: Maybe VCpuCountProperty
vCpuCount = VCpuCountProperty -> Maybe VCpuCountProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "VCpuCount" InstanceRequirementsProperty
VCpuCountProperty
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe AcceleratorCountProperty
Maybe AcceleratorTotalMemoryMiBProperty
Maybe BaselineEbsBandwidthMbpsProperty
Maybe MemoryGiBPerVCpuProperty
Maybe MemoryMiBProperty
Maybe NetworkBandwidthGbpsProperty
Maybe NetworkInterfaceCountProperty
Maybe BaselinePerformanceFactorsProperty
Maybe TotalLocalStorageGBProperty
()
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
haddock_workaround_ :: ()
acceleratorCount :: Maybe AcceleratorCountProperty
acceleratorManufacturers :: Maybe (ValueList Text)
acceleratorNames :: Maybe (ValueList Text)
acceleratorTotalMemoryMiB :: Maybe AcceleratorTotalMemoryMiBProperty
acceleratorTypes :: Maybe (ValueList Text)
allowedInstanceTypes :: Maybe (ValueList Text)
bareMetal :: Maybe (Value Text)
baselineEbsBandwidthMbps :: Maybe BaselineEbsBandwidthMbpsProperty
baselinePerformanceFactors :: Maybe BaselinePerformanceFactorsProperty
burstablePerformance :: Maybe (Value Text)
cpuManufacturers :: Maybe (ValueList Text)
excludedInstanceTypes :: Maybe (ValueList Text)
instanceGenerations :: Maybe (ValueList Text)
localStorage :: Maybe (Value Text)
localStorageTypes :: Maybe (ValueList Text)
maxSpotPriceAsPercentageOfOptimalOnDemandPrice :: Maybe (Value Integer)
memoryGiBPerVCpu :: Maybe MemoryGiBPerVCpuProperty
memoryMiB :: Maybe MemoryMiBProperty
networkBandwidthGbps :: Maybe NetworkBandwidthGbpsProperty
networkInterfaceCount :: Maybe NetworkInterfaceCountProperty
onDemandMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
requireHibernateSupport :: Maybe (Value Bool)
spotMaxPricePercentageOverLowestPrice :: Maybe (Value Integer)
totalLocalStorageGB :: Maybe TotalLocalStorageGBProperty
..}