module Stratosphere.EVS.Environment.VcfHostnamesProperty (
        VcfHostnamesProperty(..), mkVcfHostnamesProperty
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data VcfHostnamesProperty
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-evs-environment-vcfhostnames.html>
    VcfHostnamesProperty {VcfHostnamesProperty -> ()
haddock_workaround_ :: (),
                          -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-evs-environment-vcfhostnames.html#cfn-evs-environment-vcfhostnames-cloudbuilder>
                          VcfHostnamesProperty -> Value Text
cloudBuilder :: (Value Prelude.Text),
                          -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-evs-environment-vcfhostnames.html#cfn-evs-environment-vcfhostnames-nsx>
                          VcfHostnamesProperty -> Value Text
nsx :: (Value Prelude.Text),
                          -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-evs-environment-vcfhostnames.html#cfn-evs-environment-vcfhostnames-nsxedge1>
                          VcfHostnamesProperty -> Value Text
nsxEdge1 :: (Value Prelude.Text),
                          -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-evs-environment-vcfhostnames.html#cfn-evs-environment-vcfhostnames-nsxedge2>
                          VcfHostnamesProperty -> Value Text
nsxEdge2 :: (Value Prelude.Text),
                          -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-evs-environment-vcfhostnames.html#cfn-evs-environment-vcfhostnames-nsxmanager1>
                          VcfHostnamesProperty -> Value Text
nsxManager1 :: (Value Prelude.Text),
                          -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-evs-environment-vcfhostnames.html#cfn-evs-environment-vcfhostnames-nsxmanager2>
                          VcfHostnamesProperty -> Value Text
nsxManager2 :: (Value Prelude.Text),
                          -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-evs-environment-vcfhostnames.html#cfn-evs-environment-vcfhostnames-nsxmanager3>
                          VcfHostnamesProperty -> Value Text
nsxManager3 :: (Value Prelude.Text),
                          -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-evs-environment-vcfhostnames.html#cfn-evs-environment-vcfhostnames-sddcmanager>
                          VcfHostnamesProperty -> Value Text
sddcManager :: (Value Prelude.Text),
                          -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-evs-environment-vcfhostnames.html#cfn-evs-environment-vcfhostnames-vcenter>
                          VcfHostnamesProperty -> Value Text
vCenter :: (Value Prelude.Text)}
  deriving stock (VcfHostnamesProperty -> VcfHostnamesProperty -> Bool
(VcfHostnamesProperty -> VcfHostnamesProperty -> Bool)
-> (VcfHostnamesProperty -> VcfHostnamesProperty -> Bool)
-> Eq VcfHostnamesProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: VcfHostnamesProperty -> VcfHostnamesProperty -> Bool
== :: VcfHostnamesProperty -> VcfHostnamesProperty -> Bool
$c/= :: VcfHostnamesProperty -> VcfHostnamesProperty -> Bool
/= :: VcfHostnamesProperty -> VcfHostnamesProperty -> Bool
Prelude.Eq, Int -> VcfHostnamesProperty -> ShowS
[VcfHostnamesProperty] -> ShowS
VcfHostnamesProperty -> String
(Int -> VcfHostnamesProperty -> ShowS)
-> (VcfHostnamesProperty -> String)
-> ([VcfHostnamesProperty] -> ShowS)
-> Show VcfHostnamesProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> VcfHostnamesProperty -> ShowS
showsPrec :: Int -> VcfHostnamesProperty -> ShowS
$cshow :: VcfHostnamesProperty -> String
show :: VcfHostnamesProperty -> String
$cshowList :: [VcfHostnamesProperty] -> ShowS
showList :: [VcfHostnamesProperty] -> ShowS
Prelude.Show)
mkVcfHostnamesProperty ::
  Value Prelude.Text
  -> Value Prelude.Text
     -> Value Prelude.Text
        -> Value Prelude.Text
           -> Value Prelude.Text
              -> Value Prelude.Text
                 -> Value Prelude.Text
                    -> Value Prelude.Text -> Value Prelude.Text -> VcfHostnamesProperty
mkVcfHostnamesProperty :: Value Text
-> Value Text
-> Value Text
-> Value Text
-> Value Text
-> Value Text
-> Value Text
-> Value Text
-> Value Text
-> VcfHostnamesProperty
mkVcfHostnamesProperty
  Value Text
cloudBuilder
  Value Text
nsx
  Value Text
nsxEdge1
  Value Text
nsxEdge2
  Value Text
nsxManager1
  Value Text
nsxManager2
  Value Text
nsxManager3
  Value Text
sddcManager
  Value Text
vCenter
  = VcfHostnamesProperty
      {haddock_workaround_ :: ()
haddock_workaround_ = (), cloudBuilder :: Value Text
cloudBuilder = Value Text
cloudBuilder, nsx :: Value Text
nsx = Value Text
nsx,
       nsxEdge1 :: Value Text
nsxEdge1 = Value Text
nsxEdge1, nsxEdge2 :: Value Text
nsxEdge2 = Value Text
nsxEdge2,
       nsxManager1 :: Value Text
nsxManager1 = Value Text
nsxManager1, nsxManager2 :: Value Text
nsxManager2 = Value Text
nsxManager2,
       nsxManager3 :: Value Text
nsxManager3 = Value Text
nsxManager3, sddcManager :: Value Text
sddcManager = Value Text
sddcManager,
       vCenter :: Value Text
vCenter = Value Text
vCenter}
instance ToResourceProperties VcfHostnamesProperty where
  toResourceProperties :: VcfHostnamesProperty -> ResourceProperties
toResourceProperties VcfHostnamesProperty {()
Value Text
haddock_workaround_ :: VcfHostnamesProperty -> ()
cloudBuilder :: VcfHostnamesProperty -> Value Text
nsx :: VcfHostnamesProperty -> Value Text
nsxEdge1 :: VcfHostnamesProperty -> Value Text
nsxEdge2 :: VcfHostnamesProperty -> Value Text
nsxManager1 :: VcfHostnamesProperty -> Value Text
nsxManager2 :: VcfHostnamesProperty -> Value Text
nsxManager3 :: VcfHostnamesProperty -> Value Text
sddcManager :: VcfHostnamesProperty -> Value Text
vCenter :: VcfHostnamesProperty -> Value Text
haddock_workaround_ :: ()
cloudBuilder :: Value Text
nsx :: Value Text
nsxEdge1 :: Value Text
nsxEdge2 :: Value Text
nsxManager1 :: Value Text
nsxManager2 :: Value Text
nsxManager3 :: Value Text
sddcManager :: Value Text
vCenter :: Value Text
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::EVS::Environment.VcfHostnames",
         supportsTags :: Bool
supportsTags = Bool
Prelude.False,
         properties :: Object
properties = [Key
"CloudBuilder" 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
cloudBuilder,
                       Key
"Nsx" 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
nsx, Key
"NsxEdge1" 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
nsxEdge1,
                       Key
"NsxEdge2" 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
nsxEdge2, Key
"NsxManager1" 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
nsxManager1,
                       Key
"NsxManager2" 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
nsxManager2,
                       Key
"NsxManager3" 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
nsxManager3,
                       Key
"SddcManager" 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
sddcManager, Key
"VCenter" 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
vCenter]}
instance JSON.ToJSON VcfHostnamesProperty where
  toJSON :: VcfHostnamesProperty -> Value
toJSON VcfHostnamesProperty {()
Value Text
haddock_workaround_ :: VcfHostnamesProperty -> ()
cloudBuilder :: VcfHostnamesProperty -> Value Text
nsx :: VcfHostnamesProperty -> Value Text
nsxEdge1 :: VcfHostnamesProperty -> Value Text
nsxEdge2 :: VcfHostnamesProperty -> Value Text
nsxManager1 :: VcfHostnamesProperty -> Value Text
nsxManager2 :: VcfHostnamesProperty -> Value Text
nsxManager3 :: VcfHostnamesProperty -> Value Text
sddcManager :: VcfHostnamesProperty -> Value Text
vCenter :: VcfHostnamesProperty -> Value Text
haddock_workaround_ :: ()
cloudBuilder :: Value Text
nsx :: Value Text
nsxEdge1 :: Value Text
nsxEdge2 :: Value Text
nsxManager1 :: Value Text
nsxManager2 :: Value Text
nsxManager3 :: Value Text
sddcManager :: Value Text
vCenter :: Value Text
..}
    = [(Key, Value)] -> Value
JSON.object
        [Key
"CloudBuilder" 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
cloudBuilder, Key
"Nsx" 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
nsx,
         Key
"NsxEdge1" 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
nsxEdge1, Key
"NsxEdge2" 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
nsxEdge2,
         Key
"NsxManager1" 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
nsxManager1,
         Key
"NsxManager2" 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
nsxManager2,
         Key
"NsxManager3" 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
nsxManager3,
         Key
"SddcManager" 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
sddcManager, Key
"VCenter" 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
vCenter]
instance Property "CloudBuilder" VcfHostnamesProperty where
  type PropertyType "CloudBuilder" VcfHostnamesProperty = Value Prelude.Text
  set :: PropertyType "CloudBuilder" VcfHostnamesProperty
-> VcfHostnamesProperty -> VcfHostnamesProperty
set PropertyType "CloudBuilder" VcfHostnamesProperty
newValue VcfHostnamesProperty {()
Value Text
haddock_workaround_ :: VcfHostnamesProperty -> ()
cloudBuilder :: VcfHostnamesProperty -> Value Text
nsx :: VcfHostnamesProperty -> Value Text
nsxEdge1 :: VcfHostnamesProperty -> Value Text
nsxEdge2 :: VcfHostnamesProperty -> Value Text
nsxManager1 :: VcfHostnamesProperty -> Value Text
nsxManager2 :: VcfHostnamesProperty -> Value Text
nsxManager3 :: VcfHostnamesProperty -> Value Text
sddcManager :: VcfHostnamesProperty -> Value Text
vCenter :: VcfHostnamesProperty -> Value Text
haddock_workaround_ :: ()
cloudBuilder :: Value Text
nsx :: Value Text
nsxEdge1 :: Value Text
nsxEdge2 :: Value Text
nsxManager1 :: Value Text
nsxManager2 :: Value Text
nsxManager3 :: Value Text
sddcManager :: Value Text
vCenter :: Value Text
..}
    = VcfHostnamesProperty {cloudBuilder :: Value Text
cloudBuilder = PropertyType "CloudBuilder" VcfHostnamesProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
nsx :: Value Text
nsxEdge1 :: Value Text
nsxEdge2 :: Value Text
nsxManager1 :: Value Text
nsxManager2 :: Value Text
nsxManager3 :: Value Text
sddcManager :: Value Text
vCenter :: Value Text
haddock_workaround_ :: ()
nsx :: Value Text
nsxEdge1 :: Value Text
nsxEdge2 :: Value Text
nsxManager1 :: Value Text
nsxManager2 :: Value Text
nsxManager3 :: Value Text
sddcManager :: Value Text
vCenter :: Value Text
..}
instance Property "Nsx" VcfHostnamesProperty where
  type PropertyType "Nsx" VcfHostnamesProperty = Value Prelude.Text
  set :: PropertyType "Nsx" VcfHostnamesProperty
-> VcfHostnamesProperty -> VcfHostnamesProperty
set PropertyType "Nsx" VcfHostnamesProperty
newValue VcfHostnamesProperty {()
Value Text
haddock_workaround_ :: VcfHostnamesProperty -> ()
cloudBuilder :: VcfHostnamesProperty -> Value Text
nsx :: VcfHostnamesProperty -> Value Text
nsxEdge1 :: VcfHostnamesProperty -> Value Text
nsxEdge2 :: VcfHostnamesProperty -> Value Text
nsxManager1 :: VcfHostnamesProperty -> Value Text
nsxManager2 :: VcfHostnamesProperty -> Value Text
nsxManager3 :: VcfHostnamesProperty -> Value Text
sddcManager :: VcfHostnamesProperty -> Value Text
vCenter :: VcfHostnamesProperty -> Value Text
haddock_workaround_ :: ()
cloudBuilder :: Value Text
nsx :: Value Text
nsxEdge1 :: Value Text
nsxEdge2 :: Value Text
nsxManager1 :: Value Text
nsxManager2 :: Value Text
nsxManager3 :: Value Text
sddcManager :: Value Text
vCenter :: Value Text
..}
    = VcfHostnamesProperty {nsx :: Value Text
nsx = PropertyType "Nsx" VcfHostnamesProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
cloudBuilder :: Value Text
nsxEdge1 :: Value Text
nsxEdge2 :: Value Text
nsxManager1 :: Value Text
nsxManager2 :: Value Text
nsxManager3 :: Value Text
sddcManager :: Value Text
vCenter :: Value Text
haddock_workaround_ :: ()
cloudBuilder :: Value Text
nsxEdge1 :: Value Text
nsxEdge2 :: Value Text
nsxManager1 :: Value Text
nsxManager2 :: Value Text
nsxManager3 :: Value Text
sddcManager :: Value Text
vCenter :: Value Text
..}
instance Property "NsxEdge1" VcfHostnamesProperty where
  type PropertyType "NsxEdge1" VcfHostnamesProperty = Value Prelude.Text
  set :: PropertyType "NsxEdge1" VcfHostnamesProperty
-> VcfHostnamesProperty -> VcfHostnamesProperty
set PropertyType "NsxEdge1" VcfHostnamesProperty
newValue VcfHostnamesProperty {()
Value Text
haddock_workaround_ :: VcfHostnamesProperty -> ()
cloudBuilder :: VcfHostnamesProperty -> Value Text
nsx :: VcfHostnamesProperty -> Value Text
nsxEdge1 :: VcfHostnamesProperty -> Value Text
nsxEdge2 :: VcfHostnamesProperty -> Value Text
nsxManager1 :: VcfHostnamesProperty -> Value Text
nsxManager2 :: VcfHostnamesProperty -> Value Text
nsxManager3 :: VcfHostnamesProperty -> Value Text
sddcManager :: VcfHostnamesProperty -> Value Text
vCenter :: VcfHostnamesProperty -> Value Text
haddock_workaround_ :: ()
cloudBuilder :: Value Text
nsx :: Value Text
nsxEdge1 :: Value Text
nsxEdge2 :: Value Text
nsxManager1 :: Value Text
nsxManager2 :: Value Text
nsxManager3 :: Value Text
sddcManager :: Value Text
vCenter :: Value Text
..}
    = VcfHostnamesProperty {nsxEdge1 :: Value Text
nsxEdge1 = PropertyType "NsxEdge1" VcfHostnamesProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
cloudBuilder :: Value Text
nsx :: Value Text
nsxEdge2 :: Value Text
nsxManager1 :: Value Text
nsxManager2 :: Value Text
nsxManager3 :: Value Text
sddcManager :: Value Text
vCenter :: Value Text
haddock_workaround_ :: ()
cloudBuilder :: Value Text
nsx :: Value Text
nsxEdge2 :: Value Text
nsxManager1 :: Value Text
nsxManager2 :: Value Text
nsxManager3 :: Value Text
sddcManager :: Value Text
vCenter :: Value Text
..}
instance Property "NsxEdge2" VcfHostnamesProperty where
  type PropertyType "NsxEdge2" VcfHostnamesProperty = Value Prelude.Text
  set :: PropertyType "NsxEdge2" VcfHostnamesProperty
-> VcfHostnamesProperty -> VcfHostnamesProperty
set PropertyType "NsxEdge2" VcfHostnamesProperty
newValue VcfHostnamesProperty {()
Value Text
haddock_workaround_ :: VcfHostnamesProperty -> ()
cloudBuilder :: VcfHostnamesProperty -> Value Text
nsx :: VcfHostnamesProperty -> Value Text
nsxEdge1 :: VcfHostnamesProperty -> Value Text
nsxEdge2 :: VcfHostnamesProperty -> Value Text
nsxManager1 :: VcfHostnamesProperty -> Value Text
nsxManager2 :: VcfHostnamesProperty -> Value Text
nsxManager3 :: VcfHostnamesProperty -> Value Text
sddcManager :: VcfHostnamesProperty -> Value Text
vCenter :: VcfHostnamesProperty -> Value Text
haddock_workaround_ :: ()
cloudBuilder :: Value Text
nsx :: Value Text
nsxEdge1 :: Value Text
nsxEdge2 :: Value Text
nsxManager1 :: Value Text
nsxManager2 :: Value Text
nsxManager3 :: Value Text
sddcManager :: Value Text
vCenter :: Value Text
..}
    = VcfHostnamesProperty {nsxEdge2 :: Value Text
nsxEdge2 = PropertyType "NsxEdge2" VcfHostnamesProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
cloudBuilder :: Value Text
nsx :: Value Text
nsxEdge1 :: Value Text
nsxManager1 :: Value Text
nsxManager2 :: Value Text
nsxManager3 :: Value Text
sddcManager :: Value Text
vCenter :: Value Text
haddock_workaround_ :: ()
cloudBuilder :: Value Text
nsx :: Value Text
nsxEdge1 :: Value Text
nsxManager1 :: Value Text
nsxManager2 :: Value Text
nsxManager3 :: Value Text
sddcManager :: Value Text
vCenter :: Value Text
..}
instance Property "NsxManager1" VcfHostnamesProperty where
  type PropertyType "NsxManager1" VcfHostnamesProperty = Value Prelude.Text
  set :: PropertyType "NsxManager1" VcfHostnamesProperty
-> VcfHostnamesProperty -> VcfHostnamesProperty
set PropertyType "NsxManager1" VcfHostnamesProperty
newValue VcfHostnamesProperty {()
Value Text
haddock_workaround_ :: VcfHostnamesProperty -> ()
cloudBuilder :: VcfHostnamesProperty -> Value Text
nsx :: VcfHostnamesProperty -> Value Text
nsxEdge1 :: VcfHostnamesProperty -> Value Text
nsxEdge2 :: VcfHostnamesProperty -> Value Text
nsxManager1 :: VcfHostnamesProperty -> Value Text
nsxManager2 :: VcfHostnamesProperty -> Value Text
nsxManager3 :: VcfHostnamesProperty -> Value Text
sddcManager :: VcfHostnamesProperty -> Value Text
vCenter :: VcfHostnamesProperty -> Value Text
haddock_workaround_ :: ()
cloudBuilder :: Value Text
nsx :: Value Text
nsxEdge1 :: Value Text
nsxEdge2 :: Value Text
nsxManager1 :: Value Text
nsxManager2 :: Value Text
nsxManager3 :: Value Text
sddcManager :: Value Text
vCenter :: Value Text
..}
    = VcfHostnamesProperty {nsxManager1 :: Value Text
nsxManager1 = PropertyType "NsxManager1" VcfHostnamesProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
cloudBuilder :: Value Text
nsx :: Value Text
nsxEdge1 :: Value Text
nsxEdge2 :: Value Text
nsxManager2 :: Value Text
nsxManager3 :: Value Text
sddcManager :: Value Text
vCenter :: Value Text
haddock_workaround_ :: ()
cloudBuilder :: Value Text
nsx :: Value Text
nsxEdge1 :: Value Text
nsxEdge2 :: Value Text
nsxManager2 :: Value Text
nsxManager3 :: Value Text
sddcManager :: Value Text
vCenter :: Value Text
..}
instance Property "NsxManager2" VcfHostnamesProperty where
  type PropertyType "NsxManager2" VcfHostnamesProperty = Value Prelude.Text
  set :: PropertyType "NsxManager2" VcfHostnamesProperty
-> VcfHostnamesProperty -> VcfHostnamesProperty
set PropertyType "NsxManager2" VcfHostnamesProperty
newValue VcfHostnamesProperty {()
Value Text
haddock_workaround_ :: VcfHostnamesProperty -> ()
cloudBuilder :: VcfHostnamesProperty -> Value Text
nsx :: VcfHostnamesProperty -> Value Text
nsxEdge1 :: VcfHostnamesProperty -> Value Text
nsxEdge2 :: VcfHostnamesProperty -> Value Text
nsxManager1 :: VcfHostnamesProperty -> Value Text
nsxManager2 :: VcfHostnamesProperty -> Value Text
nsxManager3 :: VcfHostnamesProperty -> Value Text
sddcManager :: VcfHostnamesProperty -> Value Text
vCenter :: VcfHostnamesProperty -> Value Text
haddock_workaround_ :: ()
cloudBuilder :: Value Text
nsx :: Value Text
nsxEdge1 :: Value Text
nsxEdge2 :: Value Text
nsxManager1 :: Value Text
nsxManager2 :: Value Text
nsxManager3 :: Value Text
sddcManager :: Value Text
vCenter :: Value Text
..}
    = VcfHostnamesProperty {nsxManager2 :: Value Text
nsxManager2 = PropertyType "NsxManager2" VcfHostnamesProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
cloudBuilder :: Value Text
nsx :: Value Text
nsxEdge1 :: Value Text
nsxEdge2 :: Value Text
nsxManager1 :: Value Text
nsxManager3 :: Value Text
sddcManager :: Value Text
vCenter :: Value Text
haddock_workaround_ :: ()
cloudBuilder :: Value Text
nsx :: Value Text
nsxEdge1 :: Value Text
nsxEdge2 :: Value Text
nsxManager1 :: Value Text
nsxManager3 :: Value Text
sddcManager :: Value Text
vCenter :: Value Text
..}
instance Property "NsxManager3" VcfHostnamesProperty where
  type PropertyType "NsxManager3" VcfHostnamesProperty = Value Prelude.Text
  set :: PropertyType "NsxManager3" VcfHostnamesProperty
-> VcfHostnamesProperty -> VcfHostnamesProperty
set PropertyType "NsxManager3" VcfHostnamesProperty
newValue VcfHostnamesProperty {()
Value Text
haddock_workaround_ :: VcfHostnamesProperty -> ()
cloudBuilder :: VcfHostnamesProperty -> Value Text
nsx :: VcfHostnamesProperty -> Value Text
nsxEdge1 :: VcfHostnamesProperty -> Value Text
nsxEdge2 :: VcfHostnamesProperty -> Value Text
nsxManager1 :: VcfHostnamesProperty -> Value Text
nsxManager2 :: VcfHostnamesProperty -> Value Text
nsxManager3 :: VcfHostnamesProperty -> Value Text
sddcManager :: VcfHostnamesProperty -> Value Text
vCenter :: VcfHostnamesProperty -> Value Text
haddock_workaround_ :: ()
cloudBuilder :: Value Text
nsx :: Value Text
nsxEdge1 :: Value Text
nsxEdge2 :: Value Text
nsxManager1 :: Value Text
nsxManager2 :: Value Text
nsxManager3 :: Value Text
sddcManager :: Value Text
vCenter :: Value Text
..}
    = VcfHostnamesProperty {nsxManager3 :: Value Text
nsxManager3 = PropertyType "NsxManager3" VcfHostnamesProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
cloudBuilder :: Value Text
nsx :: Value Text
nsxEdge1 :: Value Text
nsxEdge2 :: Value Text
nsxManager1 :: Value Text
nsxManager2 :: Value Text
sddcManager :: Value Text
vCenter :: Value Text
haddock_workaround_ :: ()
cloudBuilder :: Value Text
nsx :: Value Text
nsxEdge1 :: Value Text
nsxEdge2 :: Value Text
nsxManager1 :: Value Text
nsxManager2 :: Value Text
sddcManager :: Value Text
vCenter :: Value Text
..}
instance Property "SddcManager" VcfHostnamesProperty where
  type PropertyType "SddcManager" VcfHostnamesProperty = Value Prelude.Text
  set :: PropertyType "SddcManager" VcfHostnamesProperty
-> VcfHostnamesProperty -> VcfHostnamesProperty
set PropertyType "SddcManager" VcfHostnamesProperty
newValue VcfHostnamesProperty {()
Value Text
haddock_workaround_ :: VcfHostnamesProperty -> ()
cloudBuilder :: VcfHostnamesProperty -> Value Text
nsx :: VcfHostnamesProperty -> Value Text
nsxEdge1 :: VcfHostnamesProperty -> Value Text
nsxEdge2 :: VcfHostnamesProperty -> Value Text
nsxManager1 :: VcfHostnamesProperty -> Value Text
nsxManager2 :: VcfHostnamesProperty -> Value Text
nsxManager3 :: VcfHostnamesProperty -> Value Text
sddcManager :: VcfHostnamesProperty -> Value Text
vCenter :: VcfHostnamesProperty -> Value Text
haddock_workaround_ :: ()
cloudBuilder :: Value Text
nsx :: Value Text
nsxEdge1 :: Value Text
nsxEdge2 :: Value Text
nsxManager1 :: Value Text
nsxManager2 :: Value Text
nsxManager3 :: Value Text
sddcManager :: Value Text
vCenter :: Value Text
..}
    = VcfHostnamesProperty {sddcManager :: Value Text
sddcManager = PropertyType "SddcManager" VcfHostnamesProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
cloudBuilder :: Value Text
nsx :: Value Text
nsxEdge1 :: Value Text
nsxEdge2 :: Value Text
nsxManager1 :: Value Text
nsxManager2 :: Value Text
nsxManager3 :: Value Text
vCenter :: Value Text
haddock_workaround_ :: ()
cloudBuilder :: Value Text
nsx :: Value Text
nsxEdge1 :: Value Text
nsxEdge2 :: Value Text
nsxManager1 :: Value Text
nsxManager2 :: Value Text
nsxManager3 :: Value Text
vCenter :: Value Text
..}
instance Property "VCenter" VcfHostnamesProperty where
  type PropertyType "VCenter" VcfHostnamesProperty = Value Prelude.Text
  set :: PropertyType "VCenter" VcfHostnamesProperty
-> VcfHostnamesProperty -> VcfHostnamesProperty
set PropertyType "VCenter" VcfHostnamesProperty
newValue VcfHostnamesProperty {()
Value Text
haddock_workaround_ :: VcfHostnamesProperty -> ()
cloudBuilder :: VcfHostnamesProperty -> Value Text
nsx :: VcfHostnamesProperty -> Value Text
nsxEdge1 :: VcfHostnamesProperty -> Value Text
nsxEdge2 :: VcfHostnamesProperty -> Value Text
nsxManager1 :: VcfHostnamesProperty -> Value Text
nsxManager2 :: VcfHostnamesProperty -> Value Text
nsxManager3 :: VcfHostnamesProperty -> Value Text
sddcManager :: VcfHostnamesProperty -> Value Text
vCenter :: VcfHostnamesProperty -> Value Text
haddock_workaround_ :: ()
cloudBuilder :: Value Text
nsx :: Value Text
nsxEdge1 :: Value Text
nsxEdge2 :: Value Text
nsxManager1 :: Value Text
nsxManager2 :: Value Text
nsxManager3 :: Value Text
sddcManager :: Value Text
vCenter :: Value Text
..}
    = VcfHostnamesProperty {vCenter :: Value Text
vCenter = PropertyType "VCenter" VcfHostnamesProperty
Value Text
newValue, ()
Value Text
haddock_workaround_ :: ()
cloudBuilder :: Value Text
nsx :: Value Text
nsxEdge1 :: Value Text
nsxEdge2 :: Value Text
nsxManager1 :: Value Text
nsxManager2 :: Value Text
nsxManager3 :: Value Text
sddcManager :: Value Text
haddock_workaround_ :: ()
cloudBuilder :: Value Text
nsx :: Value Text
nsxEdge1 :: Value Text
nsxEdge2 :: Value Text
nsxManager1 :: Value Text
nsxManager2 :: Value Text
nsxManager3 :: Value Text
sddcManager :: Value Text
..}