module Stratosphere.Lightsail.Instance (
module Exports, Instance(..), mkInstance
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.Lightsail.Instance.AddOnProperty as Exports
import {-# SOURCE #-} Stratosphere.Lightsail.Instance.HardwareProperty as Exports
import {-# SOURCE #-} Stratosphere.Lightsail.Instance.LocationProperty as Exports
import {-# SOURCE #-} Stratosphere.Lightsail.Instance.NetworkingProperty as Exports
import {-# SOURCE #-} Stratosphere.Lightsail.Instance.StateProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Tag
import Stratosphere.Value
data Instance
=
Instance {Instance -> ()
haddock_workaround_ :: (),
Instance -> Maybe [AddOnProperty]
addOns :: (Prelude.Maybe [AddOnProperty]),
Instance -> Maybe (Value Text)
availabilityZone :: (Prelude.Maybe (Value Prelude.Text)),
Instance -> Value Text
blueprintId :: (Value Prelude.Text),
Instance -> Value Text
bundleId :: (Value Prelude.Text),
Instance -> Maybe HardwareProperty
hardware :: (Prelude.Maybe HardwareProperty),
Instance -> Value Text
instanceName :: (Value Prelude.Text),
Instance -> Maybe (Value Text)
keyPairName :: (Prelude.Maybe (Value Prelude.Text)),
Instance -> Maybe LocationProperty
location :: (Prelude.Maybe LocationProperty),
Instance -> Maybe NetworkingProperty
networking :: (Prelude.Maybe NetworkingProperty),
Instance -> Maybe StateProperty
state :: (Prelude.Maybe StateProperty),
Instance -> Maybe [Tag]
tags :: (Prelude.Maybe [Tag]),
Instance -> Maybe (Value Text)
userData :: (Prelude.Maybe (Value Prelude.Text))}
deriving stock (Instance -> Instance -> Bool
(Instance -> Instance -> Bool)
-> (Instance -> Instance -> Bool) -> Eq Instance
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: Instance -> Instance -> Bool
== :: Instance -> Instance -> Bool
$c/= :: Instance -> Instance -> Bool
/= :: Instance -> Instance -> Bool
Prelude.Eq, Int -> Instance -> ShowS
[Instance] -> ShowS
Instance -> String
(Int -> Instance -> ShowS)
-> (Instance -> String) -> ([Instance] -> ShowS) -> Show Instance
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> Instance -> ShowS
showsPrec :: Int -> Instance -> ShowS
$cshow :: Instance -> String
show :: Instance -> String
$cshowList :: [Instance] -> ShowS
showList :: [Instance] -> ShowS
Prelude.Show)
mkInstance ::
Value Prelude.Text
-> Value Prelude.Text -> Value Prelude.Text -> Instance
mkInstance :: Value Text -> Value Text -> Value Text -> Instance
mkInstance Value Text
blueprintId Value Text
bundleId Value Text
instanceName
= Instance
{haddock_workaround_ :: ()
haddock_workaround_ = (), blueprintId :: Value Text
blueprintId = Value Text
blueprintId,
bundleId :: Value Text
bundleId = Value Text
bundleId, instanceName :: Value Text
instanceName = Value Text
instanceName,
addOns :: Maybe [AddOnProperty]
addOns = Maybe [AddOnProperty]
forall a. Maybe a
Prelude.Nothing, availabilityZone :: Maybe (Value Text)
availabilityZone = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
hardware :: Maybe HardwareProperty
hardware = Maybe HardwareProperty
forall a. Maybe a
Prelude.Nothing, keyPairName :: Maybe (Value Text)
keyPairName = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
location :: Maybe LocationProperty
location = Maybe LocationProperty
forall a. Maybe a
Prelude.Nothing, networking :: Maybe NetworkingProperty
networking = Maybe NetworkingProperty
forall a. Maybe a
Prelude.Nothing,
state :: Maybe StateProperty
state = Maybe StateProperty
forall a. Maybe a
Prelude.Nothing, tags :: Maybe [Tag]
tags = Maybe [Tag]
forall a. Maybe a
Prelude.Nothing,
userData :: Maybe (Value Text)
userData = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties Instance where
toResourceProperties :: Instance -> ResourceProperties
toResourceProperties Instance {Maybe [Tag]
Maybe [AddOnProperty]
Maybe (Value Text)
Maybe HardwareProperty
Maybe LocationProperty
Maybe NetworkingProperty
Maybe StateProperty
()
Value Text
haddock_workaround_ :: Instance -> ()
addOns :: Instance -> Maybe [AddOnProperty]
availabilityZone :: Instance -> Maybe (Value Text)
blueprintId :: Instance -> Value Text
bundleId :: Instance -> Value Text
hardware :: Instance -> Maybe HardwareProperty
instanceName :: Instance -> Value Text
keyPairName :: Instance -> Maybe (Value Text)
location :: Instance -> Maybe LocationProperty
networking :: Instance -> Maybe NetworkingProperty
state :: Instance -> Maybe StateProperty
tags :: Instance -> Maybe [Tag]
userData :: Instance -> Maybe (Value Text)
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::Lightsail::Instance", supportsTags :: Bool
supportsTags = Bool
Prelude.True,
properties :: Object
properties = [Item Object] -> Object
forall l. IsList l => [Item l] -> l
Prelude.fromList
([(Key, Value)] -> [(Key, Value)] -> [(Key, Value)]
forall a. Semigroup a => a -> a -> a
(Prelude.<>)
[Key
"BlueprintId" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
blueprintId, Key
"BundleId" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
bundleId,
Key
"InstanceName" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
instanceName]
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> [AddOnProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AddOns" ([AddOnProperty] -> (Key, Value))
-> Maybe [AddOnProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [AddOnProperty]
addOns,
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
"AvailabilityZone" (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)
availabilityZone,
Key -> HardwareProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Hardware" (HardwareProperty -> (Key, Value))
-> Maybe HardwareProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe HardwareProperty
hardware,
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
"KeyPairName" (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)
keyPairName,
Key -> LocationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Location" (LocationProperty -> (Key, Value))
-> Maybe LocationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe LocationProperty
location,
Key -> NetworkingProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Networking" (NetworkingProperty -> (Key, Value))
-> Maybe NetworkingProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe NetworkingProperty
networking,
Key -> StateProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"State" (StateProperty -> (Key, Value))
-> Maybe StateProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe StateProperty
state,
Key -> [Tag] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Tags" ([Tag] -> (Key, Value)) -> Maybe [Tag] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Tag]
tags,
Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"UserData" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
userData]))}
instance JSON.ToJSON Instance where
toJSON :: Instance -> Value
toJSON Instance {Maybe [Tag]
Maybe [AddOnProperty]
Maybe (Value Text)
Maybe HardwareProperty
Maybe LocationProperty
Maybe NetworkingProperty
Maybe StateProperty
()
Value Text
haddock_workaround_ :: Instance -> ()
addOns :: Instance -> Maybe [AddOnProperty]
availabilityZone :: Instance -> Maybe (Value Text)
blueprintId :: Instance -> Value Text
bundleId :: Instance -> Value Text
hardware :: Instance -> Maybe HardwareProperty
instanceName :: Instance -> Value Text
keyPairName :: Instance -> Maybe (Value Text)
location :: Instance -> Maybe LocationProperty
networking :: Instance -> Maybe NetworkingProperty
state :: Instance -> Maybe StateProperty
tags :: Instance -> Maybe [Tag]
userData :: Instance -> Maybe (Value Text)
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
..}
= [(Key, Value)] -> Value
JSON.object
([Item [(Key, Value)]] -> [(Key, Value)]
forall l. IsList l => [Item l] -> l
Prelude.fromList
([(Key, Value)] -> [(Key, Value)] -> [(Key, Value)]
forall a. Semigroup a => a -> a -> a
(Prelude.<>)
[Key
"BlueprintId" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
blueprintId, Key
"BundleId" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
bundleId,
Key
"InstanceName" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
instanceName]
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> [AddOnProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AddOns" ([AddOnProperty] -> (Key, Value))
-> Maybe [AddOnProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [AddOnProperty]
addOns,
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
"AvailabilityZone" (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)
availabilityZone,
Key -> HardwareProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Hardware" (HardwareProperty -> (Key, Value))
-> Maybe HardwareProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe HardwareProperty
hardware,
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
"KeyPairName" (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)
keyPairName,
Key -> LocationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Location" (LocationProperty -> (Key, Value))
-> Maybe LocationProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe LocationProperty
location,
Key -> NetworkingProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Networking" (NetworkingProperty -> (Key, Value))
-> Maybe NetworkingProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe NetworkingProperty
networking,
Key -> StateProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"State" (StateProperty -> (Key, Value))
-> Maybe StateProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe StateProperty
state,
Key -> [Tag] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Tags" ([Tag] -> (Key, Value)) -> Maybe [Tag] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Tag]
tags,
Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"UserData" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
userData])))
instance Property "AddOns" Instance where
type PropertyType "AddOns" Instance = [AddOnProperty]
set :: PropertyType "AddOns" Instance -> Instance -> Instance
set PropertyType "AddOns" Instance
newValue Instance {Maybe [Tag]
Maybe [AddOnProperty]
Maybe (Value Text)
Maybe HardwareProperty
Maybe LocationProperty
Maybe NetworkingProperty
Maybe StateProperty
()
Value Text
haddock_workaround_ :: Instance -> ()
addOns :: Instance -> Maybe [AddOnProperty]
availabilityZone :: Instance -> Maybe (Value Text)
blueprintId :: Instance -> Value Text
bundleId :: Instance -> Value Text
hardware :: Instance -> Maybe HardwareProperty
instanceName :: Instance -> Value Text
keyPairName :: Instance -> Maybe (Value Text)
location :: Instance -> Maybe LocationProperty
networking :: Instance -> Maybe NetworkingProperty
state :: Instance -> Maybe StateProperty
tags :: Instance -> Maybe [Tag]
userData :: Instance -> Maybe (Value Text)
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
..}
= Instance {addOns :: Maybe [AddOnProperty]
addOns = [AddOnProperty] -> Maybe [AddOnProperty]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [AddOnProperty]
PropertyType "AddOns" Instance
newValue, Maybe [Tag]
Maybe (Value Text)
Maybe HardwareProperty
Maybe LocationProperty
Maybe NetworkingProperty
Maybe StateProperty
()
Value Text
haddock_workaround_ :: ()
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
haddock_workaround_ :: ()
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
..}
instance Property "AvailabilityZone" Instance where
type PropertyType "AvailabilityZone" Instance = Value Prelude.Text
set :: PropertyType "AvailabilityZone" Instance -> Instance -> Instance
set PropertyType "AvailabilityZone" Instance
newValue Instance {Maybe [Tag]
Maybe [AddOnProperty]
Maybe (Value Text)
Maybe HardwareProperty
Maybe LocationProperty
Maybe NetworkingProperty
Maybe StateProperty
()
Value Text
haddock_workaround_ :: Instance -> ()
addOns :: Instance -> Maybe [AddOnProperty]
availabilityZone :: Instance -> Maybe (Value Text)
blueprintId :: Instance -> Value Text
bundleId :: Instance -> Value Text
hardware :: Instance -> Maybe HardwareProperty
instanceName :: Instance -> Value Text
keyPairName :: Instance -> Maybe (Value Text)
location :: Instance -> Maybe LocationProperty
networking :: Instance -> Maybe NetworkingProperty
state :: Instance -> Maybe StateProperty
tags :: Instance -> Maybe [Tag]
userData :: Instance -> Maybe (Value Text)
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
..}
= Instance {availabilityZone :: Maybe (Value Text)
availabilityZone = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "AvailabilityZone" Instance
Value Text
newValue, Maybe [Tag]
Maybe [AddOnProperty]
Maybe (Value Text)
Maybe HardwareProperty
Maybe LocationProperty
Maybe NetworkingProperty
Maybe StateProperty
()
Value Text
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
..}
instance Property "BlueprintId" Instance where
type PropertyType "BlueprintId" Instance = Value Prelude.Text
set :: PropertyType "BlueprintId" Instance -> Instance -> Instance
set PropertyType "BlueprintId" Instance
newValue Instance {Maybe [Tag]
Maybe [AddOnProperty]
Maybe (Value Text)
Maybe HardwareProperty
Maybe LocationProperty
Maybe NetworkingProperty
Maybe StateProperty
()
Value Text
haddock_workaround_ :: Instance -> ()
addOns :: Instance -> Maybe [AddOnProperty]
availabilityZone :: Instance -> Maybe (Value Text)
blueprintId :: Instance -> Value Text
bundleId :: Instance -> Value Text
hardware :: Instance -> Maybe HardwareProperty
instanceName :: Instance -> Value Text
keyPairName :: Instance -> Maybe (Value Text)
location :: Instance -> Maybe LocationProperty
networking :: Instance -> Maybe NetworkingProperty
state :: Instance -> Maybe StateProperty
tags :: Instance -> Maybe [Tag]
userData :: Instance -> Maybe (Value Text)
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
..} = Instance {blueprintId :: Value Text
blueprintId = PropertyType "BlueprintId" Instance
Value Text
newValue, Maybe [Tag]
Maybe [AddOnProperty]
Maybe (Value Text)
Maybe HardwareProperty
Maybe LocationProperty
Maybe NetworkingProperty
Maybe StateProperty
()
Value Text
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
..}
instance Property "BundleId" Instance where
type PropertyType "BundleId" Instance = Value Prelude.Text
set :: PropertyType "BundleId" Instance -> Instance -> Instance
set PropertyType "BundleId" Instance
newValue Instance {Maybe [Tag]
Maybe [AddOnProperty]
Maybe (Value Text)
Maybe HardwareProperty
Maybe LocationProperty
Maybe NetworkingProperty
Maybe StateProperty
()
Value Text
haddock_workaround_ :: Instance -> ()
addOns :: Instance -> Maybe [AddOnProperty]
availabilityZone :: Instance -> Maybe (Value Text)
blueprintId :: Instance -> Value Text
bundleId :: Instance -> Value Text
hardware :: Instance -> Maybe HardwareProperty
instanceName :: Instance -> Value Text
keyPairName :: Instance -> Maybe (Value Text)
location :: Instance -> Maybe LocationProperty
networking :: Instance -> Maybe NetworkingProperty
state :: Instance -> Maybe StateProperty
tags :: Instance -> Maybe [Tag]
userData :: Instance -> Maybe (Value Text)
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
..} = Instance {bundleId :: Value Text
bundleId = PropertyType "BundleId" Instance
Value Text
newValue, Maybe [Tag]
Maybe [AddOnProperty]
Maybe (Value Text)
Maybe HardwareProperty
Maybe LocationProperty
Maybe NetworkingProperty
Maybe StateProperty
()
Value Text
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
..}
instance Property "Hardware" Instance where
type PropertyType "Hardware" Instance = HardwareProperty
set :: PropertyType "Hardware" Instance -> Instance -> Instance
set PropertyType "Hardware" Instance
newValue Instance {Maybe [Tag]
Maybe [AddOnProperty]
Maybe (Value Text)
Maybe HardwareProperty
Maybe LocationProperty
Maybe NetworkingProperty
Maybe StateProperty
()
Value Text
haddock_workaround_ :: Instance -> ()
addOns :: Instance -> Maybe [AddOnProperty]
availabilityZone :: Instance -> Maybe (Value Text)
blueprintId :: Instance -> Value Text
bundleId :: Instance -> Value Text
hardware :: Instance -> Maybe HardwareProperty
instanceName :: Instance -> Value Text
keyPairName :: Instance -> Maybe (Value Text)
location :: Instance -> Maybe LocationProperty
networking :: Instance -> Maybe NetworkingProperty
state :: Instance -> Maybe StateProperty
tags :: Instance -> Maybe [Tag]
userData :: Instance -> Maybe (Value Text)
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
..}
= Instance {hardware :: Maybe HardwareProperty
hardware = HardwareProperty -> Maybe HardwareProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Hardware" Instance
HardwareProperty
newValue, Maybe [Tag]
Maybe [AddOnProperty]
Maybe (Value Text)
Maybe LocationProperty
Maybe NetworkingProperty
Maybe StateProperty
()
Value Text
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
..}
instance Property "InstanceName" Instance where
type PropertyType "InstanceName" Instance = Value Prelude.Text
set :: PropertyType "InstanceName" Instance -> Instance -> Instance
set PropertyType "InstanceName" Instance
newValue Instance {Maybe [Tag]
Maybe [AddOnProperty]
Maybe (Value Text)
Maybe HardwareProperty
Maybe LocationProperty
Maybe NetworkingProperty
Maybe StateProperty
()
Value Text
haddock_workaround_ :: Instance -> ()
addOns :: Instance -> Maybe [AddOnProperty]
availabilityZone :: Instance -> Maybe (Value Text)
blueprintId :: Instance -> Value Text
bundleId :: Instance -> Value Text
hardware :: Instance -> Maybe HardwareProperty
instanceName :: Instance -> Value Text
keyPairName :: Instance -> Maybe (Value Text)
location :: Instance -> Maybe LocationProperty
networking :: Instance -> Maybe NetworkingProperty
state :: Instance -> Maybe StateProperty
tags :: Instance -> Maybe [Tag]
userData :: Instance -> Maybe (Value Text)
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
..} = Instance {instanceName :: Value Text
instanceName = PropertyType "InstanceName" Instance
Value Text
newValue, Maybe [Tag]
Maybe [AddOnProperty]
Maybe (Value Text)
Maybe HardwareProperty
Maybe LocationProperty
Maybe NetworkingProperty
Maybe StateProperty
()
Value Text
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
..}
instance Property "KeyPairName" Instance where
type PropertyType "KeyPairName" Instance = Value Prelude.Text
set :: PropertyType "KeyPairName" Instance -> Instance -> Instance
set PropertyType "KeyPairName" Instance
newValue Instance {Maybe [Tag]
Maybe [AddOnProperty]
Maybe (Value Text)
Maybe HardwareProperty
Maybe LocationProperty
Maybe NetworkingProperty
Maybe StateProperty
()
Value Text
haddock_workaround_ :: Instance -> ()
addOns :: Instance -> Maybe [AddOnProperty]
availabilityZone :: Instance -> Maybe (Value Text)
blueprintId :: Instance -> Value Text
bundleId :: Instance -> Value Text
hardware :: Instance -> Maybe HardwareProperty
instanceName :: Instance -> Value Text
keyPairName :: Instance -> Maybe (Value Text)
location :: Instance -> Maybe LocationProperty
networking :: Instance -> Maybe NetworkingProperty
state :: Instance -> Maybe StateProperty
tags :: Instance -> Maybe [Tag]
userData :: Instance -> Maybe (Value Text)
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
..}
= Instance {keyPairName :: Maybe (Value Text)
keyPairName = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "KeyPairName" Instance
Value Text
newValue, Maybe [Tag]
Maybe [AddOnProperty]
Maybe (Value Text)
Maybe HardwareProperty
Maybe LocationProperty
Maybe NetworkingProperty
Maybe StateProperty
()
Value Text
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
..}
instance Property "Location" Instance where
type PropertyType "Location" Instance = LocationProperty
set :: PropertyType "Location" Instance -> Instance -> Instance
set PropertyType "Location" Instance
newValue Instance {Maybe [Tag]
Maybe [AddOnProperty]
Maybe (Value Text)
Maybe HardwareProperty
Maybe LocationProperty
Maybe NetworkingProperty
Maybe StateProperty
()
Value Text
haddock_workaround_ :: Instance -> ()
addOns :: Instance -> Maybe [AddOnProperty]
availabilityZone :: Instance -> Maybe (Value Text)
blueprintId :: Instance -> Value Text
bundleId :: Instance -> Value Text
hardware :: Instance -> Maybe HardwareProperty
instanceName :: Instance -> Value Text
keyPairName :: Instance -> Maybe (Value Text)
location :: Instance -> Maybe LocationProperty
networking :: Instance -> Maybe NetworkingProperty
state :: Instance -> Maybe StateProperty
tags :: Instance -> Maybe [Tag]
userData :: Instance -> Maybe (Value Text)
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
..}
= Instance {location :: Maybe LocationProperty
location = LocationProperty -> Maybe LocationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Location" Instance
LocationProperty
newValue, Maybe [Tag]
Maybe [AddOnProperty]
Maybe (Value Text)
Maybe HardwareProperty
Maybe NetworkingProperty
Maybe StateProperty
()
Value Text
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
..}
instance Property "Networking" Instance where
type PropertyType "Networking" Instance = NetworkingProperty
set :: PropertyType "Networking" Instance -> Instance -> Instance
set PropertyType "Networking" Instance
newValue Instance {Maybe [Tag]
Maybe [AddOnProperty]
Maybe (Value Text)
Maybe HardwareProperty
Maybe LocationProperty
Maybe NetworkingProperty
Maybe StateProperty
()
Value Text
haddock_workaround_ :: Instance -> ()
addOns :: Instance -> Maybe [AddOnProperty]
availabilityZone :: Instance -> Maybe (Value Text)
blueprintId :: Instance -> Value Text
bundleId :: Instance -> Value Text
hardware :: Instance -> Maybe HardwareProperty
instanceName :: Instance -> Value Text
keyPairName :: Instance -> Maybe (Value Text)
location :: Instance -> Maybe LocationProperty
networking :: Instance -> Maybe NetworkingProperty
state :: Instance -> Maybe StateProperty
tags :: Instance -> Maybe [Tag]
userData :: Instance -> Maybe (Value Text)
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
..}
= Instance {networking :: Maybe NetworkingProperty
networking = NetworkingProperty -> Maybe NetworkingProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Networking" Instance
NetworkingProperty
newValue, Maybe [Tag]
Maybe [AddOnProperty]
Maybe (Value Text)
Maybe HardwareProperty
Maybe LocationProperty
Maybe StateProperty
()
Value Text
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
..}
instance Property "State" Instance where
type PropertyType "State" Instance = StateProperty
set :: PropertyType "State" Instance -> Instance -> Instance
set PropertyType "State" Instance
newValue Instance {Maybe [Tag]
Maybe [AddOnProperty]
Maybe (Value Text)
Maybe HardwareProperty
Maybe LocationProperty
Maybe NetworkingProperty
Maybe StateProperty
()
Value Text
haddock_workaround_ :: Instance -> ()
addOns :: Instance -> Maybe [AddOnProperty]
availabilityZone :: Instance -> Maybe (Value Text)
blueprintId :: Instance -> Value Text
bundleId :: Instance -> Value Text
hardware :: Instance -> Maybe HardwareProperty
instanceName :: Instance -> Value Text
keyPairName :: Instance -> Maybe (Value Text)
location :: Instance -> Maybe LocationProperty
networking :: Instance -> Maybe NetworkingProperty
state :: Instance -> Maybe StateProperty
tags :: Instance -> Maybe [Tag]
userData :: Instance -> Maybe (Value Text)
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
..}
= Instance {state :: Maybe StateProperty
state = StateProperty -> Maybe StateProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "State" Instance
StateProperty
newValue, Maybe [Tag]
Maybe [AddOnProperty]
Maybe (Value Text)
Maybe HardwareProperty
Maybe LocationProperty
Maybe NetworkingProperty
()
Value Text
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
..}
instance Property "Tags" Instance where
type PropertyType "Tags" Instance = [Tag]
set :: PropertyType "Tags" Instance -> Instance -> Instance
set PropertyType "Tags" Instance
newValue Instance {Maybe [Tag]
Maybe [AddOnProperty]
Maybe (Value Text)
Maybe HardwareProperty
Maybe LocationProperty
Maybe NetworkingProperty
Maybe StateProperty
()
Value Text
haddock_workaround_ :: Instance -> ()
addOns :: Instance -> Maybe [AddOnProperty]
availabilityZone :: Instance -> Maybe (Value Text)
blueprintId :: Instance -> Value Text
bundleId :: Instance -> Value Text
hardware :: Instance -> Maybe HardwareProperty
instanceName :: Instance -> Value Text
keyPairName :: Instance -> Maybe (Value Text)
location :: Instance -> Maybe LocationProperty
networking :: Instance -> Maybe NetworkingProperty
state :: Instance -> Maybe StateProperty
tags :: Instance -> Maybe [Tag]
userData :: Instance -> Maybe (Value Text)
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
..}
= Instance {tags :: Maybe [Tag]
tags = [Tag] -> Maybe [Tag]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [Tag]
PropertyType "Tags" Instance
newValue, Maybe [AddOnProperty]
Maybe (Value Text)
Maybe HardwareProperty
Maybe LocationProperty
Maybe NetworkingProperty
Maybe StateProperty
()
Value Text
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
userData :: Maybe (Value Text)
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
userData :: Maybe (Value Text)
..}
instance Property "UserData" Instance where
type PropertyType "UserData" Instance = Value Prelude.Text
set :: PropertyType "UserData" Instance -> Instance -> Instance
set PropertyType "UserData" Instance
newValue Instance {Maybe [Tag]
Maybe [AddOnProperty]
Maybe (Value Text)
Maybe HardwareProperty
Maybe LocationProperty
Maybe NetworkingProperty
Maybe StateProperty
()
Value Text
haddock_workaround_ :: Instance -> ()
addOns :: Instance -> Maybe [AddOnProperty]
availabilityZone :: Instance -> Maybe (Value Text)
blueprintId :: Instance -> Value Text
bundleId :: Instance -> Value Text
hardware :: Instance -> Maybe HardwareProperty
instanceName :: Instance -> Value Text
keyPairName :: Instance -> Maybe (Value Text)
location :: Instance -> Maybe LocationProperty
networking :: Instance -> Maybe NetworkingProperty
state :: Instance -> Maybe StateProperty
tags :: Instance -> Maybe [Tag]
userData :: Instance -> Maybe (Value Text)
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
userData :: Maybe (Value Text)
..}
= Instance {userData :: Maybe (Value Text)
userData = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "UserData" Instance
Value Text
newValue, Maybe [Tag]
Maybe [AddOnProperty]
Maybe (Value Text)
Maybe HardwareProperty
Maybe LocationProperty
Maybe NetworkingProperty
Maybe StateProperty
()
Value Text
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
haddock_workaround_ :: ()
addOns :: Maybe [AddOnProperty]
availabilityZone :: Maybe (Value Text)
blueprintId :: Value Text
bundleId :: Value Text
hardware :: Maybe HardwareProperty
instanceName :: Value Text
keyPairName :: Maybe (Value Text)
location :: Maybe LocationProperty
networking :: Maybe NetworkingProperty
state :: Maybe StateProperty
tags :: Maybe [Tag]
..}