module Stratosphere.ODB.CloudAutonomousVmCluster (
        module Exports, CloudAutonomousVmCluster(..),
        mkCloudAutonomousVmCluster
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.ODB.CloudAutonomousVmCluster.MaintenanceWindowProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Tag
import Stratosphere.Value
data CloudAutonomousVmCluster
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-odb-cloudautonomousvmcluster.html>
    CloudAutonomousVmCluster {CloudAutonomousVmCluster -> ()
haddock_workaround_ :: (),
                              -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-odb-cloudautonomousvmcluster.html#cfn-odb-cloudautonomousvmcluster-autonomousdatastoragesizeintbs>
                              CloudAutonomousVmCluster -> Maybe (Value Double)
autonomousDataStorageSizeInTBs :: (Prelude.Maybe (Value Prelude.Double)),
                              -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-odb-cloudautonomousvmcluster.html#cfn-odb-cloudautonomousvmcluster-cloudexadatainfrastructureid>
                              CloudAutonomousVmCluster -> Maybe (Value Text)
cloudExadataInfrastructureId :: (Prelude.Maybe (Value Prelude.Text)),
                              -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-odb-cloudautonomousvmcluster.html#cfn-odb-cloudautonomousvmcluster-cpucorecountpernode>
                              CloudAutonomousVmCluster -> Maybe (Value Integer)
cpuCoreCountPerNode :: (Prelude.Maybe (Value Prelude.Integer)),
                              -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-odb-cloudautonomousvmcluster.html#cfn-odb-cloudautonomousvmcluster-dbservers>
                              CloudAutonomousVmCluster -> Maybe (ValueList Text)
dbServers :: (Prelude.Maybe (ValueList Prelude.Text)),
                              -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-odb-cloudautonomousvmcluster.html#cfn-odb-cloudautonomousvmcluster-description>
                              CloudAutonomousVmCluster -> Maybe (Value Text)
description :: (Prelude.Maybe (Value Prelude.Text)),
                              -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-odb-cloudautonomousvmcluster.html#cfn-odb-cloudautonomousvmcluster-displayname>
                              CloudAutonomousVmCluster -> Maybe (Value Text)
displayName :: (Prelude.Maybe (Value Prelude.Text)),
                              -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-odb-cloudautonomousvmcluster.html#cfn-odb-cloudautonomousvmcluster-ismtlsenabledvmcluster>
                              CloudAutonomousVmCluster -> Maybe (Value Bool)
isMtlsEnabledVmCluster :: (Prelude.Maybe (Value Prelude.Bool)),
                              -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-odb-cloudautonomousvmcluster.html#cfn-odb-cloudautonomousvmcluster-licensemodel>
                              CloudAutonomousVmCluster -> Maybe (Value Text)
licenseModel :: (Prelude.Maybe (Value Prelude.Text)),
                              -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-odb-cloudautonomousvmcluster.html#cfn-odb-cloudautonomousvmcluster-maintenancewindow>
                              CloudAutonomousVmCluster -> Maybe MaintenanceWindowProperty
maintenanceWindow :: (Prelude.Maybe MaintenanceWindowProperty),
                              -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-odb-cloudautonomousvmcluster.html#cfn-odb-cloudautonomousvmcluster-memoryperoraclecomputeunitingbs>
                              CloudAutonomousVmCluster -> Maybe (Value Integer)
memoryPerOracleComputeUnitInGBs :: (Prelude.Maybe (Value Prelude.Integer)),
                              -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-odb-cloudautonomousvmcluster.html#cfn-odb-cloudautonomousvmcluster-odbnetworkid>
                              CloudAutonomousVmCluster -> Maybe (Value Text)
odbNetworkId :: (Prelude.Maybe (Value Prelude.Text)),
                              -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-odb-cloudautonomousvmcluster.html#cfn-odb-cloudautonomousvmcluster-scanlistenerportnontls>
                              CloudAutonomousVmCluster -> Maybe (Value Integer)
scanListenerPortNonTls :: (Prelude.Maybe (Value Prelude.Integer)),
                              -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-odb-cloudautonomousvmcluster.html#cfn-odb-cloudautonomousvmcluster-scanlistenerporttls>
                              CloudAutonomousVmCluster -> Maybe (Value Integer)
scanListenerPortTls :: (Prelude.Maybe (Value Prelude.Integer)),
                              -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-odb-cloudautonomousvmcluster.html#cfn-odb-cloudautonomousvmcluster-tags>
                              CloudAutonomousVmCluster -> Maybe [Tag]
tags :: (Prelude.Maybe [Tag]),
                              -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-odb-cloudautonomousvmcluster.html#cfn-odb-cloudautonomousvmcluster-timezone>
                              CloudAutonomousVmCluster -> Maybe (Value Text)
timeZone :: (Prelude.Maybe (Value Prelude.Text)),
                              -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-resource-odb-cloudautonomousvmcluster.html#cfn-odb-cloudautonomousvmcluster-totalcontainerdatabases>
                              CloudAutonomousVmCluster -> Maybe (Value Integer)
totalContainerDatabases :: (Prelude.Maybe (Value Prelude.Integer))}
  deriving stock (CloudAutonomousVmCluster -> CloudAutonomousVmCluster -> Bool
(CloudAutonomousVmCluster -> CloudAutonomousVmCluster -> Bool)
-> (CloudAutonomousVmCluster -> CloudAutonomousVmCluster -> Bool)
-> Eq CloudAutonomousVmCluster
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: CloudAutonomousVmCluster -> CloudAutonomousVmCluster -> Bool
== :: CloudAutonomousVmCluster -> CloudAutonomousVmCluster -> Bool
$c/= :: CloudAutonomousVmCluster -> CloudAutonomousVmCluster -> Bool
/= :: CloudAutonomousVmCluster -> CloudAutonomousVmCluster -> Bool
Prelude.Eq, Int -> CloudAutonomousVmCluster -> ShowS
[CloudAutonomousVmCluster] -> ShowS
CloudAutonomousVmCluster -> String
(Int -> CloudAutonomousVmCluster -> ShowS)
-> (CloudAutonomousVmCluster -> String)
-> ([CloudAutonomousVmCluster] -> ShowS)
-> Show CloudAutonomousVmCluster
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> CloudAutonomousVmCluster -> ShowS
showsPrec :: Int -> CloudAutonomousVmCluster -> ShowS
$cshow :: CloudAutonomousVmCluster -> String
show :: CloudAutonomousVmCluster -> String
$cshowList :: [CloudAutonomousVmCluster] -> ShowS
showList :: [CloudAutonomousVmCluster] -> ShowS
Prelude.Show)
mkCloudAutonomousVmCluster :: CloudAutonomousVmCluster
mkCloudAutonomousVmCluster :: CloudAutonomousVmCluster
mkCloudAutonomousVmCluster
  = CloudAutonomousVmCluster
      {haddock_workaround_ :: ()
haddock_workaround_ = (),
       autonomousDataStorageSizeInTBs :: Maybe (Value Double)
autonomousDataStorageSizeInTBs = Maybe (Value Double)
forall a. Maybe a
Prelude.Nothing,
       cloudExadataInfrastructureId :: Maybe (Value Text)
cloudExadataInfrastructureId = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       cpuCoreCountPerNode :: Maybe (Value Integer)
cpuCoreCountPerNode = Maybe (Value Integer)
forall a. Maybe a
Prelude.Nothing, dbServers :: Maybe (ValueList Text)
dbServers = Maybe (ValueList Text)
forall a. Maybe a
Prelude.Nothing,
       description :: Maybe (Value Text)
description = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, displayName :: Maybe (Value Text)
displayName = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       isMtlsEnabledVmCluster :: Maybe (Value Bool)
isMtlsEnabledVmCluster = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
       licenseModel :: Maybe (Value Text)
licenseModel = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       maintenanceWindow :: Maybe MaintenanceWindowProperty
maintenanceWindow = Maybe MaintenanceWindowProperty
forall a. Maybe a
Prelude.Nothing,
       memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
memoryPerOracleComputeUnitInGBs = Maybe (Value Integer)
forall a. Maybe a
Prelude.Nothing,
       odbNetworkId :: Maybe (Value Text)
odbNetworkId = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortNonTls = Maybe (Value Integer)
forall a. Maybe a
Prelude.Nothing,
       scanListenerPortTls :: Maybe (Value Integer)
scanListenerPortTls = Maybe (Value Integer)
forall a. Maybe a
Prelude.Nothing, tags :: Maybe [Tag]
tags = Maybe [Tag]
forall a. Maybe a
Prelude.Nothing,
       timeZone :: Maybe (Value Text)
timeZone = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       totalContainerDatabases :: Maybe (Value Integer)
totalContainerDatabases = Maybe (Value Integer)
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties CloudAutonomousVmCluster where
  toResourceProperties :: CloudAutonomousVmCluster -> ResourceProperties
toResourceProperties CloudAutonomousVmCluster {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: CloudAutonomousVmCluster -> ()
autonomousDataStorageSizeInTBs :: CloudAutonomousVmCluster -> Maybe (Value Double)
cloudExadataInfrastructureId :: CloudAutonomousVmCluster -> Maybe (Value Text)
cpuCoreCountPerNode :: CloudAutonomousVmCluster -> Maybe (Value Integer)
dbServers :: CloudAutonomousVmCluster -> Maybe (ValueList Text)
description :: CloudAutonomousVmCluster -> Maybe (Value Text)
displayName :: CloudAutonomousVmCluster -> Maybe (Value Text)
isMtlsEnabledVmCluster :: CloudAutonomousVmCluster -> Maybe (Value Bool)
licenseModel :: CloudAutonomousVmCluster -> Maybe (Value Text)
maintenanceWindow :: CloudAutonomousVmCluster -> Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: CloudAutonomousVmCluster -> Maybe (Value Integer)
odbNetworkId :: CloudAutonomousVmCluster -> Maybe (Value Text)
scanListenerPortNonTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
scanListenerPortTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
tags :: CloudAutonomousVmCluster -> Maybe [Tag]
timeZone :: CloudAutonomousVmCluster -> Maybe (Value Text)
totalContainerDatabases :: CloudAutonomousVmCluster -> Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::ODB::CloudAutonomousVmCluster",
         supportsTags :: Bool
supportsTags = Bool
Prelude.True,
         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 -> Value Double -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AutonomousDataStorageSizeInTBs"
                              (Value Double -> (Key, Value))
-> Maybe (Value Double) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Double)
autonomousDataStorageSizeInTBs,
                            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
"CloudExadataInfrastructureId"
                              (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)
cloudExadataInfrastructureId,
                            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
"CpuCoreCountPerNode" (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)
cpuCoreCountPerNode,
                            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
"DbServers" (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)
dbServers,
                            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
"Description" (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)
description,
                            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
"DisplayName" (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)
displayName,
                            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
"IsMtlsEnabledVmCluster"
                              (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)
isMtlsEnabledVmCluster,
                            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
"LicenseModel" (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)
licenseModel,
                            Key -> MaintenanceWindowProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"MaintenanceWindow" (MaintenanceWindowProperty -> (Key, Value))
-> Maybe MaintenanceWindowProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe MaintenanceWindowProperty
maintenanceWindow,
                            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
"MemoryPerOracleComputeUnitInGBs"
                              (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)
memoryPerOracleComputeUnitInGBs,
                            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
"OdbNetworkId" (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)
odbNetworkId,
                            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
"ScanListenerPortNonTls"
                              (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)
scanListenerPortNonTls,
                            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
"ScanListenerPortTls" (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)
scanListenerPortTls,
                            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
"TimeZone" (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)
timeZone,
                            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
"TotalContainerDatabases"
                              (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)
totalContainerDatabases])}
instance JSON.ToJSON CloudAutonomousVmCluster where
  toJSON :: CloudAutonomousVmCluster -> Value
toJSON CloudAutonomousVmCluster {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: CloudAutonomousVmCluster -> ()
autonomousDataStorageSizeInTBs :: CloudAutonomousVmCluster -> Maybe (Value Double)
cloudExadataInfrastructureId :: CloudAutonomousVmCluster -> Maybe (Value Text)
cpuCoreCountPerNode :: CloudAutonomousVmCluster -> Maybe (Value Integer)
dbServers :: CloudAutonomousVmCluster -> Maybe (ValueList Text)
description :: CloudAutonomousVmCluster -> Maybe (Value Text)
displayName :: CloudAutonomousVmCluster -> Maybe (Value Text)
isMtlsEnabledVmCluster :: CloudAutonomousVmCluster -> Maybe (Value Bool)
licenseModel :: CloudAutonomousVmCluster -> Maybe (Value Text)
maintenanceWindow :: CloudAutonomousVmCluster -> Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: CloudAutonomousVmCluster -> Maybe (Value Integer)
odbNetworkId :: CloudAutonomousVmCluster -> Maybe (Value Text)
scanListenerPortNonTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
scanListenerPortTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
tags :: CloudAutonomousVmCluster -> Maybe [Tag]
timeZone :: CloudAutonomousVmCluster -> Maybe (Value Text)
totalContainerDatabases :: CloudAutonomousVmCluster -> Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
    = [(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 -> Value Double -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"AutonomousDataStorageSizeInTBs"
                 (Value Double -> (Key, Value))
-> Maybe (Value Double) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Double)
autonomousDataStorageSizeInTBs,
               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
"CloudExadataInfrastructureId"
                 (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)
cloudExadataInfrastructureId,
               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
"CpuCoreCountPerNode" (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)
cpuCoreCountPerNode,
               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
"DbServers" (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)
dbServers,
               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
"Description" (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)
description,
               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
"DisplayName" (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)
displayName,
               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
"IsMtlsEnabledVmCluster"
                 (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)
isMtlsEnabledVmCluster,
               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
"LicenseModel" (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)
licenseModel,
               Key -> MaintenanceWindowProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"MaintenanceWindow" (MaintenanceWindowProperty -> (Key, Value))
-> Maybe MaintenanceWindowProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe MaintenanceWindowProperty
maintenanceWindow,
               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
"MemoryPerOracleComputeUnitInGBs"
                 (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)
memoryPerOracleComputeUnitInGBs,
               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
"OdbNetworkId" (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)
odbNetworkId,
               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
"ScanListenerPortNonTls"
                 (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)
scanListenerPortNonTls,
               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
"ScanListenerPortTls" (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)
scanListenerPortTls,
               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
"TimeZone" (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)
timeZone,
               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
"TotalContainerDatabases"
                 (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)
totalContainerDatabases]))
instance Property "AutonomousDataStorageSizeInTBs" CloudAutonomousVmCluster where
  type PropertyType "AutonomousDataStorageSizeInTBs" CloudAutonomousVmCluster = Value Prelude.Double
  set :: PropertyType
  "AutonomousDataStorageSizeInTBs" CloudAutonomousVmCluster
-> CloudAutonomousVmCluster -> CloudAutonomousVmCluster
set PropertyType
  "AutonomousDataStorageSizeInTBs" CloudAutonomousVmCluster
newValue CloudAutonomousVmCluster {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: CloudAutonomousVmCluster -> ()
autonomousDataStorageSizeInTBs :: CloudAutonomousVmCluster -> Maybe (Value Double)
cloudExadataInfrastructureId :: CloudAutonomousVmCluster -> Maybe (Value Text)
cpuCoreCountPerNode :: CloudAutonomousVmCluster -> Maybe (Value Integer)
dbServers :: CloudAutonomousVmCluster -> Maybe (ValueList Text)
description :: CloudAutonomousVmCluster -> Maybe (Value Text)
displayName :: CloudAutonomousVmCluster -> Maybe (Value Text)
isMtlsEnabledVmCluster :: CloudAutonomousVmCluster -> Maybe (Value Bool)
licenseModel :: CloudAutonomousVmCluster -> Maybe (Value Text)
maintenanceWindow :: CloudAutonomousVmCluster -> Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: CloudAutonomousVmCluster -> Maybe (Value Integer)
odbNetworkId :: CloudAutonomousVmCluster -> Maybe (Value Text)
scanListenerPortNonTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
scanListenerPortTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
tags :: CloudAutonomousVmCluster -> Maybe [Tag]
timeZone :: CloudAutonomousVmCluster -> Maybe (Value Text)
totalContainerDatabases :: CloudAutonomousVmCluster -> Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
    = CloudAutonomousVmCluster
        {autonomousDataStorageSizeInTBs :: Maybe (Value Double)
autonomousDataStorageSizeInTBs = Value Double -> Maybe (Value Double)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
  "AutonomousDataStorageSizeInTBs" CloudAutonomousVmCluster
Value Double
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: ()
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
haddock_workaround_ :: ()
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
instance Property "CloudExadataInfrastructureId" CloudAutonomousVmCluster where
  type PropertyType "CloudExadataInfrastructureId" CloudAutonomousVmCluster = Value Prelude.Text
  set :: PropertyType
  "CloudExadataInfrastructureId" CloudAutonomousVmCluster
-> CloudAutonomousVmCluster -> CloudAutonomousVmCluster
set PropertyType
  "CloudExadataInfrastructureId" CloudAutonomousVmCluster
newValue CloudAutonomousVmCluster {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: CloudAutonomousVmCluster -> ()
autonomousDataStorageSizeInTBs :: CloudAutonomousVmCluster -> Maybe (Value Double)
cloudExadataInfrastructureId :: CloudAutonomousVmCluster -> Maybe (Value Text)
cpuCoreCountPerNode :: CloudAutonomousVmCluster -> Maybe (Value Integer)
dbServers :: CloudAutonomousVmCluster -> Maybe (ValueList Text)
description :: CloudAutonomousVmCluster -> Maybe (Value Text)
displayName :: CloudAutonomousVmCluster -> Maybe (Value Text)
isMtlsEnabledVmCluster :: CloudAutonomousVmCluster -> Maybe (Value Bool)
licenseModel :: CloudAutonomousVmCluster -> Maybe (Value Text)
maintenanceWindow :: CloudAutonomousVmCluster -> Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: CloudAutonomousVmCluster -> Maybe (Value Integer)
odbNetworkId :: CloudAutonomousVmCluster -> Maybe (Value Text)
scanListenerPortNonTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
scanListenerPortTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
tags :: CloudAutonomousVmCluster -> Maybe [Tag]
timeZone :: CloudAutonomousVmCluster -> Maybe (Value Text)
totalContainerDatabases :: CloudAutonomousVmCluster -> Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
    = CloudAutonomousVmCluster
        {cloudExadataInfrastructureId :: Maybe (Value Text)
cloudExadataInfrastructureId = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
  "CloudExadataInfrastructureId" CloudAutonomousVmCluster
Value Text
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
instance Property "CpuCoreCountPerNode" CloudAutonomousVmCluster where
  type PropertyType "CpuCoreCountPerNode" CloudAutonomousVmCluster = Value Prelude.Integer
  set :: PropertyType "CpuCoreCountPerNode" CloudAutonomousVmCluster
-> CloudAutonomousVmCluster -> CloudAutonomousVmCluster
set PropertyType "CpuCoreCountPerNode" CloudAutonomousVmCluster
newValue CloudAutonomousVmCluster {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: CloudAutonomousVmCluster -> ()
autonomousDataStorageSizeInTBs :: CloudAutonomousVmCluster -> Maybe (Value Double)
cloudExadataInfrastructureId :: CloudAutonomousVmCluster -> Maybe (Value Text)
cpuCoreCountPerNode :: CloudAutonomousVmCluster -> Maybe (Value Integer)
dbServers :: CloudAutonomousVmCluster -> Maybe (ValueList Text)
description :: CloudAutonomousVmCluster -> Maybe (Value Text)
displayName :: CloudAutonomousVmCluster -> Maybe (Value Text)
isMtlsEnabledVmCluster :: CloudAutonomousVmCluster -> Maybe (Value Bool)
licenseModel :: CloudAutonomousVmCluster -> Maybe (Value Text)
maintenanceWindow :: CloudAutonomousVmCluster -> Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: CloudAutonomousVmCluster -> Maybe (Value Integer)
odbNetworkId :: CloudAutonomousVmCluster -> Maybe (Value Text)
scanListenerPortNonTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
scanListenerPortTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
tags :: CloudAutonomousVmCluster -> Maybe [Tag]
timeZone :: CloudAutonomousVmCluster -> Maybe (Value Text)
totalContainerDatabases :: CloudAutonomousVmCluster -> Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
    = CloudAutonomousVmCluster
        {cpuCoreCountPerNode :: Maybe (Value Integer)
cpuCoreCountPerNode = Value Integer -> Maybe (Value Integer)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "CpuCoreCountPerNode" CloudAutonomousVmCluster
Value Integer
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
instance Property "DbServers" CloudAutonomousVmCluster where
  type PropertyType "DbServers" CloudAutonomousVmCluster = ValueList Prelude.Text
  set :: PropertyType "DbServers" CloudAutonomousVmCluster
-> CloudAutonomousVmCluster -> CloudAutonomousVmCluster
set PropertyType "DbServers" CloudAutonomousVmCluster
newValue CloudAutonomousVmCluster {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: CloudAutonomousVmCluster -> ()
autonomousDataStorageSizeInTBs :: CloudAutonomousVmCluster -> Maybe (Value Double)
cloudExadataInfrastructureId :: CloudAutonomousVmCluster -> Maybe (Value Text)
cpuCoreCountPerNode :: CloudAutonomousVmCluster -> Maybe (Value Integer)
dbServers :: CloudAutonomousVmCluster -> Maybe (ValueList Text)
description :: CloudAutonomousVmCluster -> Maybe (Value Text)
displayName :: CloudAutonomousVmCluster -> Maybe (Value Text)
isMtlsEnabledVmCluster :: CloudAutonomousVmCluster -> Maybe (Value Bool)
licenseModel :: CloudAutonomousVmCluster -> Maybe (Value Text)
maintenanceWindow :: CloudAutonomousVmCluster -> Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: CloudAutonomousVmCluster -> Maybe (Value Integer)
odbNetworkId :: CloudAutonomousVmCluster -> Maybe (Value Text)
scanListenerPortNonTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
scanListenerPortTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
tags :: CloudAutonomousVmCluster -> Maybe [Tag]
timeZone :: CloudAutonomousVmCluster -> Maybe (Value Text)
totalContainerDatabases :: CloudAutonomousVmCluster -> Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
    = CloudAutonomousVmCluster {dbServers :: Maybe (ValueList Text)
dbServers = ValueList Text -> Maybe (ValueList Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "DbServers" CloudAutonomousVmCluster
ValueList Text
newValue, Maybe [Tag]
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
instance Property "Description" CloudAutonomousVmCluster where
  type PropertyType "Description" CloudAutonomousVmCluster = Value Prelude.Text
  set :: PropertyType "Description" CloudAutonomousVmCluster
-> CloudAutonomousVmCluster -> CloudAutonomousVmCluster
set PropertyType "Description" CloudAutonomousVmCluster
newValue CloudAutonomousVmCluster {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: CloudAutonomousVmCluster -> ()
autonomousDataStorageSizeInTBs :: CloudAutonomousVmCluster -> Maybe (Value Double)
cloudExadataInfrastructureId :: CloudAutonomousVmCluster -> Maybe (Value Text)
cpuCoreCountPerNode :: CloudAutonomousVmCluster -> Maybe (Value Integer)
dbServers :: CloudAutonomousVmCluster -> Maybe (ValueList Text)
description :: CloudAutonomousVmCluster -> Maybe (Value Text)
displayName :: CloudAutonomousVmCluster -> Maybe (Value Text)
isMtlsEnabledVmCluster :: CloudAutonomousVmCluster -> Maybe (Value Bool)
licenseModel :: CloudAutonomousVmCluster -> Maybe (Value Text)
maintenanceWindow :: CloudAutonomousVmCluster -> Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: CloudAutonomousVmCluster -> Maybe (Value Integer)
odbNetworkId :: CloudAutonomousVmCluster -> Maybe (Value Text)
scanListenerPortNonTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
scanListenerPortTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
tags :: CloudAutonomousVmCluster -> Maybe [Tag]
timeZone :: CloudAutonomousVmCluster -> Maybe (Value Text)
totalContainerDatabases :: CloudAutonomousVmCluster -> Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
    = CloudAutonomousVmCluster
        {description :: Maybe (Value Text)
description = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Description" CloudAutonomousVmCluster
Value Text
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
instance Property "DisplayName" CloudAutonomousVmCluster where
  type PropertyType "DisplayName" CloudAutonomousVmCluster = Value Prelude.Text
  set :: PropertyType "DisplayName" CloudAutonomousVmCluster
-> CloudAutonomousVmCluster -> CloudAutonomousVmCluster
set PropertyType "DisplayName" CloudAutonomousVmCluster
newValue CloudAutonomousVmCluster {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: CloudAutonomousVmCluster -> ()
autonomousDataStorageSizeInTBs :: CloudAutonomousVmCluster -> Maybe (Value Double)
cloudExadataInfrastructureId :: CloudAutonomousVmCluster -> Maybe (Value Text)
cpuCoreCountPerNode :: CloudAutonomousVmCluster -> Maybe (Value Integer)
dbServers :: CloudAutonomousVmCluster -> Maybe (ValueList Text)
description :: CloudAutonomousVmCluster -> Maybe (Value Text)
displayName :: CloudAutonomousVmCluster -> Maybe (Value Text)
isMtlsEnabledVmCluster :: CloudAutonomousVmCluster -> Maybe (Value Bool)
licenseModel :: CloudAutonomousVmCluster -> Maybe (Value Text)
maintenanceWindow :: CloudAutonomousVmCluster -> Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: CloudAutonomousVmCluster -> Maybe (Value Integer)
odbNetworkId :: CloudAutonomousVmCluster -> Maybe (Value Text)
scanListenerPortNonTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
scanListenerPortTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
tags :: CloudAutonomousVmCluster -> Maybe [Tag]
timeZone :: CloudAutonomousVmCluster -> Maybe (Value Text)
totalContainerDatabases :: CloudAutonomousVmCluster -> Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
    = CloudAutonomousVmCluster
        {displayName :: Maybe (Value Text)
displayName = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "DisplayName" CloudAutonomousVmCluster
Value Text
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
instance Property "IsMtlsEnabledVmCluster" CloudAutonomousVmCluster where
  type PropertyType "IsMtlsEnabledVmCluster" CloudAutonomousVmCluster = Value Prelude.Bool
  set :: PropertyType "IsMtlsEnabledVmCluster" CloudAutonomousVmCluster
-> CloudAutonomousVmCluster -> CloudAutonomousVmCluster
set PropertyType "IsMtlsEnabledVmCluster" CloudAutonomousVmCluster
newValue CloudAutonomousVmCluster {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: CloudAutonomousVmCluster -> ()
autonomousDataStorageSizeInTBs :: CloudAutonomousVmCluster -> Maybe (Value Double)
cloudExadataInfrastructureId :: CloudAutonomousVmCluster -> Maybe (Value Text)
cpuCoreCountPerNode :: CloudAutonomousVmCluster -> Maybe (Value Integer)
dbServers :: CloudAutonomousVmCluster -> Maybe (ValueList Text)
description :: CloudAutonomousVmCluster -> Maybe (Value Text)
displayName :: CloudAutonomousVmCluster -> Maybe (Value Text)
isMtlsEnabledVmCluster :: CloudAutonomousVmCluster -> Maybe (Value Bool)
licenseModel :: CloudAutonomousVmCluster -> Maybe (Value Text)
maintenanceWindow :: CloudAutonomousVmCluster -> Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: CloudAutonomousVmCluster -> Maybe (Value Integer)
odbNetworkId :: CloudAutonomousVmCluster -> Maybe (Value Text)
scanListenerPortNonTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
scanListenerPortTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
tags :: CloudAutonomousVmCluster -> Maybe [Tag]
timeZone :: CloudAutonomousVmCluster -> Maybe (Value Text)
totalContainerDatabases :: CloudAutonomousVmCluster -> Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
    = CloudAutonomousVmCluster
        {isMtlsEnabledVmCluster :: Maybe (Value Bool)
isMtlsEnabledVmCluster = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "IsMtlsEnabledVmCluster" CloudAutonomousVmCluster
Value Bool
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
instance Property "LicenseModel" CloudAutonomousVmCluster where
  type PropertyType "LicenseModel" CloudAutonomousVmCluster = Value Prelude.Text
  set :: PropertyType "LicenseModel" CloudAutonomousVmCluster
-> CloudAutonomousVmCluster -> CloudAutonomousVmCluster
set PropertyType "LicenseModel" CloudAutonomousVmCluster
newValue CloudAutonomousVmCluster {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: CloudAutonomousVmCluster -> ()
autonomousDataStorageSizeInTBs :: CloudAutonomousVmCluster -> Maybe (Value Double)
cloudExadataInfrastructureId :: CloudAutonomousVmCluster -> Maybe (Value Text)
cpuCoreCountPerNode :: CloudAutonomousVmCluster -> Maybe (Value Integer)
dbServers :: CloudAutonomousVmCluster -> Maybe (ValueList Text)
description :: CloudAutonomousVmCluster -> Maybe (Value Text)
displayName :: CloudAutonomousVmCluster -> Maybe (Value Text)
isMtlsEnabledVmCluster :: CloudAutonomousVmCluster -> Maybe (Value Bool)
licenseModel :: CloudAutonomousVmCluster -> Maybe (Value Text)
maintenanceWindow :: CloudAutonomousVmCluster -> Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: CloudAutonomousVmCluster -> Maybe (Value Integer)
odbNetworkId :: CloudAutonomousVmCluster -> Maybe (Value Text)
scanListenerPortNonTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
scanListenerPortTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
tags :: CloudAutonomousVmCluster -> Maybe [Tag]
timeZone :: CloudAutonomousVmCluster -> Maybe (Value Text)
totalContainerDatabases :: CloudAutonomousVmCluster -> Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
    = CloudAutonomousVmCluster
        {licenseModel :: Maybe (Value Text)
licenseModel = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "LicenseModel" CloudAutonomousVmCluster
Value Text
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
instance Property "MaintenanceWindow" CloudAutonomousVmCluster where
  type PropertyType "MaintenanceWindow" CloudAutonomousVmCluster = MaintenanceWindowProperty
  set :: PropertyType "MaintenanceWindow" CloudAutonomousVmCluster
-> CloudAutonomousVmCluster -> CloudAutonomousVmCluster
set PropertyType "MaintenanceWindow" CloudAutonomousVmCluster
newValue CloudAutonomousVmCluster {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: CloudAutonomousVmCluster -> ()
autonomousDataStorageSizeInTBs :: CloudAutonomousVmCluster -> Maybe (Value Double)
cloudExadataInfrastructureId :: CloudAutonomousVmCluster -> Maybe (Value Text)
cpuCoreCountPerNode :: CloudAutonomousVmCluster -> Maybe (Value Integer)
dbServers :: CloudAutonomousVmCluster -> Maybe (ValueList Text)
description :: CloudAutonomousVmCluster -> Maybe (Value Text)
displayName :: CloudAutonomousVmCluster -> Maybe (Value Text)
isMtlsEnabledVmCluster :: CloudAutonomousVmCluster -> Maybe (Value Bool)
licenseModel :: CloudAutonomousVmCluster -> Maybe (Value Text)
maintenanceWindow :: CloudAutonomousVmCluster -> Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: CloudAutonomousVmCluster -> Maybe (Value Integer)
odbNetworkId :: CloudAutonomousVmCluster -> Maybe (Value Text)
scanListenerPortNonTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
scanListenerPortTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
tags :: CloudAutonomousVmCluster -> Maybe [Tag]
timeZone :: CloudAutonomousVmCluster -> Maybe (Value Text)
totalContainerDatabases :: CloudAutonomousVmCluster -> Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
    = CloudAutonomousVmCluster
        {maintenanceWindow :: Maybe MaintenanceWindowProperty
maintenanceWindow = MaintenanceWindowProperty -> Maybe MaintenanceWindowProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "MaintenanceWindow" CloudAutonomousVmCluster
MaintenanceWindowProperty
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
()
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
instance Property "MemoryPerOracleComputeUnitInGBs" CloudAutonomousVmCluster where
  type PropertyType "MemoryPerOracleComputeUnitInGBs" CloudAutonomousVmCluster = Value Prelude.Integer
  set :: PropertyType
  "MemoryPerOracleComputeUnitInGBs" CloudAutonomousVmCluster
-> CloudAutonomousVmCluster -> CloudAutonomousVmCluster
set PropertyType
  "MemoryPerOracleComputeUnitInGBs" CloudAutonomousVmCluster
newValue CloudAutonomousVmCluster {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: CloudAutonomousVmCluster -> ()
autonomousDataStorageSizeInTBs :: CloudAutonomousVmCluster -> Maybe (Value Double)
cloudExadataInfrastructureId :: CloudAutonomousVmCluster -> Maybe (Value Text)
cpuCoreCountPerNode :: CloudAutonomousVmCluster -> Maybe (Value Integer)
dbServers :: CloudAutonomousVmCluster -> Maybe (ValueList Text)
description :: CloudAutonomousVmCluster -> Maybe (Value Text)
displayName :: CloudAutonomousVmCluster -> Maybe (Value Text)
isMtlsEnabledVmCluster :: CloudAutonomousVmCluster -> Maybe (Value Bool)
licenseModel :: CloudAutonomousVmCluster -> Maybe (Value Text)
maintenanceWindow :: CloudAutonomousVmCluster -> Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: CloudAutonomousVmCluster -> Maybe (Value Integer)
odbNetworkId :: CloudAutonomousVmCluster -> Maybe (Value Text)
scanListenerPortNonTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
scanListenerPortTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
tags :: CloudAutonomousVmCluster -> Maybe [Tag]
timeZone :: CloudAutonomousVmCluster -> Maybe (Value Text)
totalContainerDatabases :: CloudAutonomousVmCluster -> Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
    = CloudAutonomousVmCluster
        {memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
memoryPerOracleComputeUnitInGBs = Value Integer -> Maybe (Value Integer)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
  "MemoryPerOracleComputeUnitInGBs" CloudAutonomousVmCluster
Value Integer
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
instance Property "OdbNetworkId" CloudAutonomousVmCluster where
  type PropertyType "OdbNetworkId" CloudAutonomousVmCluster = Value Prelude.Text
  set :: PropertyType "OdbNetworkId" CloudAutonomousVmCluster
-> CloudAutonomousVmCluster -> CloudAutonomousVmCluster
set PropertyType "OdbNetworkId" CloudAutonomousVmCluster
newValue CloudAutonomousVmCluster {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: CloudAutonomousVmCluster -> ()
autonomousDataStorageSizeInTBs :: CloudAutonomousVmCluster -> Maybe (Value Double)
cloudExadataInfrastructureId :: CloudAutonomousVmCluster -> Maybe (Value Text)
cpuCoreCountPerNode :: CloudAutonomousVmCluster -> Maybe (Value Integer)
dbServers :: CloudAutonomousVmCluster -> Maybe (ValueList Text)
description :: CloudAutonomousVmCluster -> Maybe (Value Text)
displayName :: CloudAutonomousVmCluster -> Maybe (Value Text)
isMtlsEnabledVmCluster :: CloudAutonomousVmCluster -> Maybe (Value Bool)
licenseModel :: CloudAutonomousVmCluster -> Maybe (Value Text)
maintenanceWindow :: CloudAutonomousVmCluster -> Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: CloudAutonomousVmCluster -> Maybe (Value Integer)
odbNetworkId :: CloudAutonomousVmCluster -> Maybe (Value Text)
scanListenerPortNonTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
scanListenerPortTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
tags :: CloudAutonomousVmCluster -> Maybe [Tag]
timeZone :: CloudAutonomousVmCluster -> Maybe (Value Text)
totalContainerDatabases :: CloudAutonomousVmCluster -> Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
    = CloudAutonomousVmCluster
        {odbNetworkId :: Maybe (Value Text)
odbNetworkId = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "OdbNetworkId" CloudAutonomousVmCluster
Value Text
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
instance Property "ScanListenerPortNonTls" CloudAutonomousVmCluster where
  type PropertyType "ScanListenerPortNonTls" CloudAutonomousVmCluster = Value Prelude.Integer
  set :: PropertyType "ScanListenerPortNonTls" CloudAutonomousVmCluster
-> CloudAutonomousVmCluster -> CloudAutonomousVmCluster
set PropertyType "ScanListenerPortNonTls" CloudAutonomousVmCluster
newValue CloudAutonomousVmCluster {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: CloudAutonomousVmCluster -> ()
autonomousDataStorageSizeInTBs :: CloudAutonomousVmCluster -> Maybe (Value Double)
cloudExadataInfrastructureId :: CloudAutonomousVmCluster -> Maybe (Value Text)
cpuCoreCountPerNode :: CloudAutonomousVmCluster -> Maybe (Value Integer)
dbServers :: CloudAutonomousVmCluster -> Maybe (ValueList Text)
description :: CloudAutonomousVmCluster -> Maybe (Value Text)
displayName :: CloudAutonomousVmCluster -> Maybe (Value Text)
isMtlsEnabledVmCluster :: CloudAutonomousVmCluster -> Maybe (Value Bool)
licenseModel :: CloudAutonomousVmCluster -> Maybe (Value Text)
maintenanceWindow :: CloudAutonomousVmCluster -> Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: CloudAutonomousVmCluster -> Maybe (Value Integer)
odbNetworkId :: CloudAutonomousVmCluster -> Maybe (Value Text)
scanListenerPortNonTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
scanListenerPortTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
tags :: CloudAutonomousVmCluster -> Maybe [Tag]
timeZone :: CloudAutonomousVmCluster -> Maybe (Value Text)
totalContainerDatabases :: CloudAutonomousVmCluster -> Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
    = CloudAutonomousVmCluster
        {scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortNonTls = Value Integer -> Maybe (Value Integer)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ScanListenerPortNonTls" CloudAutonomousVmCluster
Value Integer
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
instance Property "ScanListenerPortTls" CloudAutonomousVmCluster where
  type PropertyType "ScanListenerPortTls" CloudAutonomousVmCluster = Value Prelude.Integer
  set :: PropertyType "ScanListenerPortTls" CloudAutonomousVmCluster
-> CloudAutonomousVmCluster -> CloudAutonomousVmCluster
set PropertyType "ScanListenerPortTls" CloudAutonomousVmCluster
newValue CloudAutonomousVmCluster {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: CloudAutonomousVmCluster -> ()
autonomousDataStorageSizeInTBs :: CloudAutonomousVmCluster -> Maybe (Value Double)
cloudExadataInfrastructureId :: CloudAutonomousVmCluster -> Maybe (Value Text)
cpuCoreCountPerNode :: CloudAutonomousVmCluster -> Maybe (Value Integer)
dbServers :: CloudAutonomousVmCluster -> Maybe (ValueList Text)
description :: CloudAutonomousVmCluster -> Maybe (Value Text)
displayName :: CloudAutonomousVmCluster -> Maybe (Value Text)
isMtlsEnabledVmCluster :: CloudAutonomousVmCluster -> Maybe (Value Bool)
licenseModel :: CloudAutonomousVmCluster -> Maybe (Value Text)
maintenanceWindow :: CloudAutonomousVmCluster -> Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: CloudAutonomousVmCluster -> Maybe (Value Integer)
odbNetworkId :: CloudAutonomousVmCluster -> Maybe (Value Text)
scanListenerPortNonTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
scanListenerPortTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
tags :: CloudAutonomousVmCluster -> Maybe [Tag]
timeZone :: CloudAutonomousVmCluster -> Maybe (Value Text)
totalContainerDatabases :: CloudAutonomousVmCluster -> Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
    = CloudAutonomousVmCluster
        {scanListenerPortTls :: Maybe (Value Integer)
scanListenerPortTls = Value Integer -> Maybe (Value Integer)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ScanListenerPortTls" CloudAutonomousVmCluster
Value Integer
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
instance Property "Tags" CloudAutonomousVmCluster where
  type PropertyType "Tags" CloudAutonomousVmCluster = [Tag]
  set :: PropertyType "Tags" CloudAutonomousVmCluster
-> CloudAutonomousVmCluster -> CloudAutonomousVmCluster
set PropertyType "Tags" CloudAutonomousVmCluster
newValue CloudAutonomousVmCluster {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: CloudAutonomousVmCluster -> ()
autonomousDataStorageSizeInTBs :: CloudAutonomousVmCluster -> Maybe (Value Double)
cloudExadataInfrastructureId :: CloudAutonomousVmCluster -> Maybe (Value Text)
cpuCoreCountPerNode :: CloudAutonomousVmCluster -> Maybe (Value Integer)
dbServers :: CloudAutonomousVmCluster -> Maybe (ValueList Text)
description :: CloudAutonomousVmCluster -> Maybe (Value Text)
displayName :: CloudAutonomousVmCluster -> Maybe (Value Text)
isMtlsEnabledVmCluster :: CloudAutonomousVmCluster -> Maybe (Value Bool)
licenseModel :: CloudAutonomousVmCluster -> Maybe (Value Text)
maintenanceWindow :: CloudAutonomousVmCluster -> Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: CloudAutonomousVmCluster -> Maybe (Value Integer)
odbNetworkId :: CloudAutonomousVmCluster -> Maybe (Value Text)
scanListenerPortNonTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
scanListenerPortTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
tags :: CloudAutonomousVmCluster -> Maybe [Tag]
timeZone :: CloudAutonomousVmCluster -> Maybe (Value Text)
totalContainerDatabases :: CloudAutonomousVmCluster -> Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
    = CloudAutonomousVmCluster {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" CloudAutonomousVmCluster
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
instance Property "TimeZone" CloudAutonomousVmCluster where
  type PropertyType "TimeZone" CloudAutonomousVmCluster = Value Prelude.Text
  set :: PropertyType "TimeZone" CloudAutonomousVmCluster
-> CloudAutonomousVmCluster -> CloudAutonomousVmCluster
set PropertyType "TimeZone" CloudAutonomousVmCluster
newValue CloudAutonomousVmCluster {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: CloudAutonomousVmCluster -> ()
autonomousDataStorageSizeInTBs :: CloudAutonomousVmCluster -> Maybe (Value Double)
cloudExadataInfrastructureId :: CloudAutonomousVmCluster -> Maybe (Value Text)
cpuCoreCountPerNode :: CloudAutonomousVmCluster -> Maybe (Value Integer)
dbServers :: CloudAutonomousVmCluster -> Maybe (ValueList Text)
description :: CloudAutonomousVmCluster -> Maybe (Value Text)
displayName :: CloudAutonomousVmCluster -> Maybe (Value Text)
isMtlsEnabledVmCluster :: CloudAutonomousVmCluster -> Maybe (Value Bool)
licenseModel :: CloudAutonomousVmCluster -> Maybe (Value Text)
maintenanceWindow :: CloudAutonomousVmCluster -> Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: CloudAutonomousVmCluster -> Maybe (Value Integer)
odbNetworkId :: CloudAutonomousVmCluster -> Maybe (Value Text)
scanListenerPortNonTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
scanListenerPortTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
tags :: CloudAutonomousVmCluster -> Maybe [Tag]
timeZone :: CloudAutonomousVmCluster -> Maybe (Value Text)
totalContainerDatabases :: CloudAutonomousVmCluster -> Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
    = CloudAutonomousVmCluster {timeZone :: Maybe (Value Text)
timeZone = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "TimeZone" CloudAutonomousVmCluster
Value Text
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
totalContainerDatabases :: Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
totalContainerDatabases :: Maybe (Value Integer)
..}
instance Property "TotalContainerDatabases" CloudAutonomousVmCluster where
  type PropertyType "TotalContainerDatabases" CloudAutonomousVmCluster = Value Prelude.Integer
  set :: PropertyType "TotalContainerDatabases" CloudAutonomousVmCluster
-> CloudAutonomousVmCluster -> CloudAutonomousVmCluster
set PropertyType "TotalContainerDatabases" CloudAutonomousVmCluster
newValue CloudAutonomousVmCluster {Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: CloudAutonomousVmCluster -> ()
autonomousDataStorageSizeInTBs :: CloudAutonomousVmCluster -> Maybe (Value Double)
cloudExadataInfrastructureId :: CloudAutonomousVmCluster -> Maybe (Value Text)
cpuCoreCountPerNode :: CloudAutonomousVmCluster -> Maybe (Value Integer)
dbServers :: CloudAutonomousVmCluster -> Maybe (ValueList Text)
description :: CloudAutonomousVmCluster -> Maybe (Value Text)
displayName :: CloudAutonomousVmCluster -> Maybe (Value Text)
isMtlsEnabledVmCluster :: CloudAutonomousVmCluster -> Maybe (Value Bool)
licenseModel :: CloudAutonomousVmCluster -> Maybe (Value Text)
maintenanceWindow :: CloudAutonomousVmCluster -> Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: CloudAutonomousVmCluster -> Maybe (Value Integer)
odbNetworkId :: CloudAutonomousVmCluster -> Maybe (Value Text)
scanListenerPortNonTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
scanListenerPortTls :: CloudAutonomousVmCluster -> Maybe (Value Integer)
tags :: CloudAutonomousVmCluster -> Maybe [Tag]
timeZone :: CloudAutonomousVmCluster -> Maybe (Value Text)
totalContainerDatabases :: CloudAutonomousVmCluster -> Maybe (Value Integer)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
totalContainerDatabases :: Maybe (Value Integer)
..}
    = CloudAutonomousVmCluster
        {totalContainerDatabases :: Maybe (Value Integer)
totalContainerDatabases = Value Integer -> Maybe (Value Integer)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "TotalContainerDatabases" CloudAutonomousVmCluster
Value Integer
newValue, Maybe [Tag]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Double)
Maybe (Value Integer)
Maybe (Value Text)
Maybe MaintenanceWindowProperty
()
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
haddock_workaround_ :: ()
autonomousDataStorageSizeInTBs :: Maybe (Value Double)
cloudExadataInfrastructureId :: Maybe (Value Text)
cpuCoreCountPerNode :: Maybe (Value Integer)
dbServers :: Maybe (ValueList Text)
description :: Maybe (Value Text)
displayName :: Maybe (Value Text)
isMtlsEnabledVmCluster :: Maybe (Value Bool)
licenseModel :: Maybe (Value Text)
maintenanceWindow :: Maybe MaintenanceWindowProperty
memoryPerOracleComputeUnitInGBs :: Maybe (Value Integer)
odbNetworkId :: Maybe (Value Text)
scanListenerPortNonTls :: Maybe (Value Integer)
scanListenerPortTls :: Maybe (Value Integer)
tags :: Maybe [Tag]
timeZone :: Maybe (Value Text)
..}