module Stratosphere.Elasticsearch.Domain.ElasticsearchClusterConfigProperty (
        module Exports, ElasticsearchClusterConfigProperty(..),
        mkElasticsearchClusterConfigProperty
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.Elasticsearch.Domain.ColdStorageOptionsProperty as Exports
import {-# SOURCE #-} Stratosphere.Elasticsearch.Domain.ZoneAwarenessConfigProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Value
data ElasticsearchClusterConfigProperty
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-elasticsearch-domain-elasticsearchclusterconfig.html>
    ElasticsearchClusterConfigProperty {ElasticsearchClusterConfigProperty -> ()
haddock_workaround_ :: (),
                                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-elasticsearch-domain-elasticsearchclusterconfig.html#cfn-elasticsearch-domain-elasticsearchclusterconfig-coldstorageoptions>
                                        ElasticsearchClusterConfigProperty
-> Maybe ColdStorageOptionsProperty
coldStorageOptions :: (Prelude.Maybe ColdStorageOptionsProperty),
                                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-elasticsearch-domain-elasticsearchclusterconfig.html#cfn-elasticsearch-domain-elasticseachclusterconfig-dedicatedmastercount>
                                        ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
dedicatedMasterCount :: (Prelude.Maybe (Value Prelude.Integer)),
                                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-elasticsearch-domain-elasticsearchclusterconfig.html#cfn-elasticsearch-domain-elasticseachclusterconfig-dedicatedmasterenabled>
                                        ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
dedicatedMasterEnabled :: (Prelude.Maybe (Value Prelude.Bool)),
                                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-elasticsearch-domain-elasticsearchclusterconfig.html#cfn-elasticsearch-domain-elasticseachclusterconfig-dedicatedmastertype>
                                        ElasticsearchClusterConfigProperty -> Maybe (Value Text)
dedicatedMasterType :: (Prelude.Maybe (Value Prelude.Text)),
                                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-elasticsearch-domain-elasticsearchclusterconfig.html#cfn-elasticsearch-domain-elasticseachclusterconfig-instancecount>
                                        ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
instanceCount :: (Prelude.Maybe (Value Prelude.Integer)),
                                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-elasticsearch-domain-elasticsearchclusterconfig.html#cfn-elasticsearch-domain-elasticseachclusterconfig-instnacetype>
                                        ElasticsearchClusterConfigProperty -> Maybe (Value Text)
instanceType :: (Prelude.Maybe (Value Prelude.Text)),
                                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-elasticsearch-domain-elasticsearchclusterconfig.html#cfn-elasticsearch-domain-elasticsearchclusterconfig-warmcount>
                                        ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
warmCount :: (Prelude.Maybe (Value Prelude.Integer)),
                                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-elasticsearch-domain-elasticsearchclusterconfig.html#cfn-elasticsearch-domain-elasticsearchclusterconfig-warmenabled>
                                        ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
warmEnabled :: (Prelude.Maybe (Value Prelude.Bool)),
                                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-elasticsearch-domain-elasticsearchclusterconfig.html#cfn-elasticsearch-domain-elasticsearchclusterconfig-warmtype>
                                        ElasticsearchClusterConfigProperty -> Maybe (Value Text)
warmType :: (Prelude.Maybe (Value Prelude.Text)),
                                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-elasticsearch-domain-elasticsearchclusterconfig.html#cfn-elasticsearch-domain-elasticsearchclusterconfig-zoneawarenessconfig>
                                        ElasticsearchClusterConfigProperty
-> Maybe ZoneAwarenessConfigProperty
zoneAwarenessConfig :: (Prelude.Maybe ZoneAwarenessConfigProperty),
                                        -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-elasticsearch-domain-elasticsearchclusterconfig.html#cfn-elasticsearch-domain-elasticseachclusterconfig-zoneawarenessenabled>
                                        ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
zoneAwarenessEnabled :: (Prelude.Maybe (Value Prelude.Bool))}
  deriving stock (ElasticsearchClusterConfigProperty
-> ElasticsearchClusterConfigProperty -> Bool
(ElasticsearchClusterConfigProperty
 -> ElasticsearchClusterConfigProperty -> Bool)
-> (ElasticsearchClusterConfigProperty
    -> ElasticsearchClusterConfigProperty -> Bool)
-> Eq ElasticsearchClusterConfigProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: ElasticsearchClusterConfigProperty
-> ElasticsearchClusterConfigProperty -> Bool
== :: ElasticsearchClusterConfigProperty
-> ElasticsearchClusterConfigProperty -> Bool
$c/= :: ElasticsearchClusterConfigProperty
-> ElasticsearchClusterConfigProperty -> Bool
/= :: ElasticsearchClusterConfigProperty
-> ElasticsearchClusterConfigProperty -> Bool
Prelude.Eq, Int -> ElasticsearchClusterConfigProperty -> ShowS
[ElasticsearchClusterConfigProperty] -> ShowS
ElasticsearchClusterConfigProperty -> String
(Int -> ElasticsearchClusterConfigProperty -> ShowS)
-> (ElasticsearchClusterConfigProperty -> String)
-> ([ElasticsearchClusterConfigProperty] -> ShowS)
-> Show ElasticsearchClusterConfigProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> ElasticsearchClusterConfigProperty -> ShowS
showsPrec :: Int -> ElasticsearchClusterConfigProperty -> ShowS
$cshow :: ElasticsearchClusterConfigProperty -> String
show :: ElasticsearchClusterConfigProperty -> String
$cshowList :: [ElasticsearchClusterConfigProperty] -> ShowS
showList :: [ElasticsearchClusterConfigProperty] -> ShowS
Prelude.Show)
mkElasticsearchClusterConfigProperty ::
  ElasticsearchClusterConfigProperty
mkElasticsearchClusterConfigProperty :: ElasticsearchClusterConfigProperty
mkElasticsearchClusterConfigProperty
  = ElasticsearchClusterConfigProperty
      {haddock_workaround_ :: ()
haddock_workaround_ = (), coldStorageOptions :: Maybe ColdStorageOptionsProperty
coldStorageOptions = Maybe ColdStorageOptionsProperty
forall a. Maybe a
Prelude.Nothing,
       dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterCount = Maybe (Value Integer)
forall a. Maybe a
Prelude.Nothing,
       dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterEnabled = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
       dedicatedMasterType :: Maybe (Value Text)
dedicatedMasterType = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       instanceCount :: Maybe (Value Integer)
instanceCount = Maybe (Value Integer)
forall a. Maybe a
Prelude.Nothing, instanceType :: Maybe (Value Text)
instanceType = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       warmCount :: Maybe (Value Integer)
warmCount = Maybe (Value Integer)
forall a. Maybe a
Prelude.Nothing, warmEnabled :: Maybe (Value Bool)
warmEnabled = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
       warmType :: Maybe (Value Text)
warmType = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessConfig = Maybe ZoneAwarenessConfigProperty
forall a. Maybe a
Prelude.Nothing,
       zoneAwarenessEnabled :: Maybe (Value Bool)
zoneAwarenessEnabled = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties ElasticsearchClusterConfigProperty where
  toResourceProperties :: ElasticsearchClusterConfigProperty -> ResourceProperties
toResourceProperties ElasticsearchClusterConfigProperty {Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe ColdStorageOptionsProperty
Maybe ZoneAwarenessConfigProperty
()
haddock_workaround_ :: ElasticsearchClusterConfigProperty -> ()
coldStorageOptions :: ElasticsearchClusterConfigProperty
-> Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
dedicatedMasterEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
dedicatedMasterType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
instanceCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
instanceType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
warmCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
warmEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
warmType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
zoneAwarenessConfig :: ElasticsearchClusterConfigProperty
-> Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterType :: Maybe (Value Text)
instanceCount :: Maybe (Value Integer)
instanceType :: Maybe (Value Text)
warmCount :: Maybe (Value Integer)
warmEnabled :: Maybe (Value Bool)
warmType :: Maybe (Value Text)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: Maybe (Value Bool)
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::Elasticsearch::Domain.ElasticsearchClusterConfig",
         supportsTags :: Bool
supportsTags = Bool
Prelude.False,
         properties :: Object
properties = [Item Object] -> Object
forall l. IsList l => [Item l] -> l
Prelude.fromList
                        ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                           [Key -> ColdStorageOptionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ColdStorageOptions" (ColdStorageOptionsProperty -> (Key, Value))
-> Maybe ColdStorageOptionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ColdStorageOptionsProperty
coldStorageOptions,
                            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
"DedicatedMasterCount" (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)
dedicatedMasterCount,
                            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
"DedicatedMasterEnabled"
                              (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)
dedicatedMasterEnabled,
                            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
"DedicatedMasterType" (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)
dedicatedMasterType,
                            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
"InstanceCount" (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)
instanceCount,
                            Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"InstanceType" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
instanceType,
                            Key -> Value 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
"WarmCount" (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)
warmCount,
                            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
"WarmEnabled" (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)
warmEnabled,
                            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
"WarmType" (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)
warmType,
                            Key -> ZoneAwarenessConfigProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ZoneAwarenessConfig" (ZoneAwarenessConfigProperty -> (Key, Value))
-> Maybe ZoneAwarenessConfigProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ZoneAwarenessConfigProperty
zoneAwarenessConfig,
                            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
"ZoneAwarenessEnabled"
                              (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)
zoneAwarenessEnabled])}
instance JSON.ToJSON ElasticsearchClusterConfigProperty where
  toJSON :: ElasticsearchClusterConfigProperty -> Value
toJSON ElasticsearchClusterConfigProperty {Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe ColdStorageOptionsProperty
Maybe ZoneAwarenessConfigProperty
()
haddock_workaround_ :: ElasticsearchClusterConfigProperty -> ()
coldStorageOptions :: ElasticsearchClusterConfigProperty
-> Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
dedicatedMasterEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
dedicatedMasterType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
instanceCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
instanceType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
warmCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
warmEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
warmType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
zoneAwarenessConfig :: ElasticsearchClusterConfigProperty
-> Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterType :: Maybe (Value Text)
instanceCount :: Maybe (Value Integer)
instanceType :: Maybe (Value Text)
warmCount :: Maybe (Value Integer)
warmEnabled :: Maybe (Value Bool)
warmType :: Maybe (Value Text)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: Maybe (Value Bool)
..}
    = [(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 -> ColdStorageOptionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ColdStorageOptions" (ColdStorageOptionsProperty -> (Key, Value))
-> Maybe ColdStorageOptionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ColdStorageOptionsProperty
coldStorageOptions,
               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
"DedicatedMasterCount" (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)
dedicatedMasterCount,
               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
"DedicatedMasterEnabled"
                 (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)
dedicatedMasterEnabled,
               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
"DedicatedMasterType" (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)
dedicatedMasterType,
               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
"InstanceCount" (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)
instanceCount,
               Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"InstanceType" (Value Text -> (Key, Value))
-> Maybe (Value Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Text)
instanceType,
               Key -> Value 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
"WarmCount" (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)
warmCount,
               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
"WarmEnabled" (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)
warmEnabled,
               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
"WarmType" (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)
warmType,
               Key -> ZoneAwarenessConfigProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ZoneAwarenessConfig" (ZoneAwarenessConfigProperty -> (Key, Value))
-> Maybe ZoneAwarenessConfigProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ZoneAwarenessConfigProperty
zoneAwarenessConfig,
               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
"ZoneAwarenessEnabled"
                 (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)
zoneAwarenessEnabled]))
instance Property "ColdStorageOptions" ElasticsearchClusterConfigProperty where
  type PropertyType "ColdStorageOptions" ElasticsearchClusterConfigProperty = ColdStorageOptionsProperty
  set :: PropertyType
  "ColdStorageOptions" ElasticsearchClusterConfigProperty
-> ElasticsearchClusterConfigProperty
-> ElasticsearchClusterConfigProperty
set PropertyType
  "ColdStorageOptions" ElasticsearchClusterConfigProperty
newValue ElasticsearchClusterConfigProperty {Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe ColdStorageOptionsProperty
Maybe ZoneAwarenessConfigProperty
()
haddock_workaround_ :: ElasticsearchClusterConfigProperty -> ()
coldStorageOptions :: ElasticsearchClusterConfigProperty
-> Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
dedicatedMasterEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
dedicatedMasterType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
instanceCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
instanceType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
warmCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
warmEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
warmType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
zoneAwarenessConfig :: ElasticsearchClusterConfigProperty
-> Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterType :: Maybe (Value Text)
instanceCount :: Maybe (Value Integer)
instanceType :: Maybe (Value Text)
warmCount :: Maybe (Value Integer)
warmEnabled :: Maybe (Value Bool)
warmType :: Maybe (Value Text)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: Maybe (Value Bool)
..}
    = ElasticsearchClusterConfigProperty
        {coldStorageOptions :: Maybe ColdStorageOptionsProperty
coldStorageOptions = ColdStorageOptionsProperty -> Maybe ColdStorageOptionsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
  "ColdStorageOptions" ElasticsearchClusterConfigProperty
ColdStorageOptionsProperty
newValue, Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe ZoneAwarenessConfigProperty
()
haddock_workaround_ :: ()
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterType :: Maybe (Value Text)
instanceCount :: Maybe (Value Integer)
instanceType :: Maybe (Value Text)
warmCount :: Maybe (Value Integer)
warmEnabled :: Maybe (Value Bool)
warmType :: Maybe (Value Text)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: Maybe (Value Bool)
haddock_workaround_ :: ()
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterType :: Maybe (Value Text)
instanceCount :: Maybe (Value Integer)
instanceType :: Maybe (Value Text)
warmCount :: Maybe (Value Integer)
warmEnabled :: Maybe (Value Bool)
warmType :: Maybe (Value Text)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: Maybe (Value Bool)
..}
instance Property "DedicatedMasterCount" ElasticsearchClusterConfigProperty where
  type PropertyType "DedicatedMasterCount" ElasticsearchClusterConfigProperty = Value Prelude.Integer
  set :: PropertyType
  "DedicatedMasterCount" ElasticsearchClusterConfigProperty
-> ElasticsearchClusterConfigProperty
-> ElasticsearchClusterConfigProperty
set PropertyType
  "DedicatedMasterCount" ElasticsearchClusterConfigProperty
newValue ElasticsearchClusterConfigProperty {Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe ColdStorageOptionsProperty
Maybe ZoneAwarenessConfigProperty
()
haddock_workaround_ :: ElasticsearchClusterConfigProperty -> ()
coldStorageOptions :: ElasticsearchClusterConfigProperty
-> Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
dedicatedMasterEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
dedicatedMasterType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
instanceCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
instanceType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
warmCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
warmEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
warmType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
zoneAwarenessConfig :: ElasticsearchClusterConfigProperty
-> Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterType :: Maybe (Value Text)
instanceCount :: Maybe (Value Integer)
instanceType :: Maybe (Value Text)
warmCount :: Maybe (Value Integer)
warmEnabled :: Maybe (Value Bool)
warmType :: Maybe (Value Text)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: Maybe (Value Bool)
..}
    = ElasticsearchClusterConfigProperty
        {dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterCount = Value Integer -> Maybe (Value Integer)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
  "DedicatedMasterCount" ElasticsearchClusterConfigProperty
Value Integer
newValue, Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe ColdStorageOptionsProperty
Maybe ZoneAwarenessConfigProperty
()
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterType :: Maybe (Value Text)
instanceCount :: Maybe (Value Integer)
instanceType :: Maybe (Value Text)
warmCount :: Maybe (Value Integer)
warmEnabled :: Maybe (Value Bool)
warmType :: Maybe (Value Text)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: Maybe (Value Bool)
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterType :: Maybe (Value Text)
instanceCount :: Maybe (Value Integer)
instanceType :: Maybe (Value Text)
warmCount :: Maybe (Value Integer)
warmEnabled :: Maybe (Value Bool)
warmType :: Maybe (Value Text)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: Maybe (Value Bool)
..}
instance Property "DedicatedMasterEnabled" ElasticsearchClusterConfigProperty where
  type PropertyType "DedicatedMasterEnabled" ElasticsearchClusterConfigProperty = Value Prelude.Bool
  set :: PropertyType
  "DedicatedMasterEnabled" ElasticsearchClusterConfigProperty
-> ElasticsearchClusterConfigProperty
-> ElasticsearchClusterConfigProperty
set PropertyType
  "DedicatedMasterEnabled" ElasticsearchClusterConfigProperty
newValue ElasticsearchClusterConfigProperty {Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe ColdStorageOptionsProperty
Maybe ZoneAwarenessConfigProperty
()
haddock_workaround_ :: ElasticsearchClusterConfigProperty -> ()
coldStorageOptions :: ElasticsearchClusterConfigProperty
-> Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
dedicatedMasterEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
dedicatedMasterType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
instanceCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
instanceType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
warmCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
warmEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
warmType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
zoneAwarenessConfig :: ElasticsearchClusterConfigProperty
-> Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterType :: Maybe (Value Text)
instanceCount :: Maybe (Value Integer)
instanceType :: Maybe (Value Text)
warmCount :: Maybe (Value Integer)
warmEnabled :: Maybe (Value Bool)
warmType :: Maybe (Value Text)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: Maybe (Value Bool)
..}
    = ElasticsearchClusterConfigProperty
        {dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterEnabled = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
  "DedicatedMasterEnabled" ElasticsearchClusterConfigProperty
Value Bool
newValue, Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe ColdStorageOptionsProperty
Maybe ZoneAwarenessConfigProperty
()
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterType :: Maybe (Value Text)
instanceCount :: Maybe (Value Integer)
instanceType :: Maybe (Value Text)
warmCount :: Maybe (Value Integer)
warmEnabled :: Maybe (Value Bool)
warmType :: Maybe (Value Text)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: Maybe (Value Bool)
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterType :: Maybe (Value Text)
instanceCount :: Maybe (Value Integer)
instanceType :: Maybe (Value Text)
warmCount :: Maybe (Value Integer)
warmEnabled :: Maybe (Value Bool)
warmType :: Maybe (Value Text)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: Maybe (Value Bool)
..}
instance Property "DedicatedMasterType" ElasticsearchClusterConfigProperty where
  type PropertyType "DedicatedMasterType" ElasticsearchClusterConfigProperty = Value Prelude.Text
  set :: PropertyType
  "DedicatedMasterType" ElasticsearchClusterConfigProperty
-> ElasticsearchClusterConfigProperty
-> ElasticsearchClusterConfigProperty
set PropertyType
  "DedicatedMasterType" ElasticsearchClusterConfigProperty
newValue ElasticsearchClusterConfigProperty {Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe ColdStorageOptionsProperty
Maybe ZoneAwarenessConfigProperty
()
haddock_workaround_ :: ElasticsearchClusterConfigProperty -> ()
coldStorageOptions :: ElasticsearchClusterConfigProperty
-> Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
dedicatedMasterEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
dedicatedMasterType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
instanceCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
instanceType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
warmCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
warmEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
warmType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
zoneAwarenessConfig :: ElasticsearchClusterConfigProperty
-> Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterType :: Maybe (Value Text)
instanceCount :: Maybe (Value Integer)
instanceType :: Maybe (Value Text)
warmCount :: Maybe (Value Integer)
warmEnabled :: Maybe (Value Bool)
warmType :: Maybe (Value Text)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: Maybe (Value Bool)
..}
    = ElasticsearchClusterConfigProperty
        {dedicatedMasterType :: Maybe (Value Text)
dedicatedMasterType = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
  "DedicatedMasterType" ElasticsearchClusterConfigProperty
Value Text
newValue, Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe ColdStorageOptionsProperty
Maybe ZoneAwarenessConfigProperty
()
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterEnabled :: Maybe (Value Bool)
instanceCount :: Maybe (Value Integer)
instanceType :: Maybe (Value Text)
warmCount :: Maybe (Value Integer)
warmEnabled :: Maybe (Value Bool)
warmType :: Maybe (Value Text)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: Maybe (Value Bool)
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterEnabled :: Maybe (Value Bool)
instanceCount :: Maybe (Value Integer)
instanceType :: Maybe (Value Text)
warmCount :: Maybe (Value Integer)
warmEnabled :: Maybe (Value Bool)
warmType :: Maybe (Value Text)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: Maybe (Value Bool)
..}
instance Property "InstanceCount" ElasticsearchClusterConfigProperty where
  type PropertyType "InstanceCount" ElasticsearchClusterConfigProperty = Value Prelude.Integer
  set :: PropertyType "InstanceCount" ElasticsearchClusterConfigProperty
-> ElasticsearchClusterConfigProperty
-> ElasticsearchClusterConfigProperty
set PropertyType "InstanceCount" ElasticsearchClusterConfigProperty
newValue ElasticsearchClusterConfigProperty {Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe ColdStorageOptionsProperty
Maybe ZoneAwarenessConfigProperty
()
haddock_workaround_ :: ElasticsearchClusterConfigProperty -> ()
coldStorageOptions :: ElasticsearchClusterConfigProperty
-> Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
dedicatedMasterEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
dedicatedMasterType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
instanceCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
instanceType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
warmCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
warmEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
warmType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
zoneAwarenessConfig :: ElasticsearchClusterConfigProperty
-> Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterType :: Maybe (Value Text)
instanceCount :: Maybe (Value Integer)
instanceType :: Maybe (Value Text)
warmCount :: Maybe (Value Integer)
warmEnabled :: Maybe (Value Bool)
warmType :: Maybe (Value Text)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: Maybe (Value Bool)
..}
    = ElasticsearchClusterConfigProperty
        {instanceCount :: Maybe (Value Integer)
instanceCount = Value Integer -> Maybe (Value Integer)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "InstanceCount" ElasticsearchClusterConfigProperty
Value Integer
newValue, Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe ColdStorageOptionsProperty
Maybe ZoneAwarenessConfigProperty
()
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterType :: Maybe (Value Text)
instanceType :: Maybe (Value Text)
warmCount :: Maybe (Value Integer)
warmEnabled :: Maybe (Value Bool)
warmType :: Maybe (Value Text)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: Maybe (Value Bool)
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterType :: Maybe (Value Text)
instanceType :: Maybe (Value Text)
warmCount :: Maybe (Value Integer)
warmEnabled :: Maybe (Value Bool)
warmType :: Maybe (Value Text)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: Maybe (Value Bool)
..}
instance Property "InstanceType" ElasticsearchClusterConfigProperty where
  type PropertyType "InstanceType" ElasticsearchClusterConfigProperty = Value Prelude.Text
  set :: PropertyType "InstanceType" ElasticsearchClusterConfigProperty
-> ElasticsearchClusterConfigProperty
-> ElasticsearchClusterConfigProperty
set PropertyType "InstanceType" ElasticsearchClusterConfigProperty
newValue ElasticsearchClusterConfigProperty {Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe ColdStorageOptionsProperty
Maybe ZoneAwarenessConfigProperty
()
haddock_workaround_ :: ElasticsearchClusterConfigProperty -> ()
coldStorageOptions :: ElasticsearchClusterConfigProperty
-> Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
dedicatedMasterEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
dedicatedMasterType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
instanceCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
instanceType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
warmCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
warmEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
warmType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
zoneAwarenessConfig :: ElasticsearchClusterConfigProperty
-> Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterType :: Maybe (Value Text)
instanceCount :: Maybe (Value Integer)
instanceType :: Maybe (Value Text)
warmCount :: Maybe (Value Integer)
warmEnabled :: Maybe (Value Bool)
warmType :: Maybe (Value Text)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: Maybe (Value Bool)
..}
    = ElasticsearchClusterConfigProperty
        {instanceType :: Maybe (Value Text)
instanceType = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "InstanceType" ElasticsearchClusterConfigProperty
Value Text
newValue, Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe ColdStorageOptionsProperty
Maybe ZoneAwarenessConfigProperty
()
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterType :: Maybe (Value Text)
instanceCount :: Maybe (Value Integer)
warmCount :: Maybe (Value Integer)
warmEnabled :: Maybe (Value Bool)
warmType :: Maybe (Value Text)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: Maybe (Value Bool)
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterType :: Maybe (Value Text)
instanceCount :: Maybe (Value Integer)
warmCount :: Maybe (Value Integer)
warmEnabled :: Maybe (Value Bool)
warmType :: Maybe (Value Text)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: Maybe (Value Bool)
..}
instance Property "WarmCount" ElasticsearchClusterConfigProperty where
  type PropertyType "WarmCount" ElasticsearchClusterConfigProperty = Value Prelude.Integer
  set :: PropertyType "WarmCount" ElasticsearchClusterConfigProperty
-> ElasticsearchClusterConfigProperty
-> ElasticsearchClusterConfigProperty
set PropertyType "WarmCount" ElasticsearchClusterConfigProperty
newValue ElasticsearchClusterConfigProperty {Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe ColdStorageOptionsProperty
Maybe ZoneAwarenessConfigProperty
()
haddock_workaround_ :: ElasticsearchClusterConfigProperty -> ()
coldStorageOptions :: ElasticsearchClusterConfigProperty
-> Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
dedicatedMasterEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
dedicatedMasterType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
instanceCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
instanceType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
warmCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
warmEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
warmType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
zoneAwarenessConfig :: ElasticsearchClusterConfigProperty
-> Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterType :: Maybe (Value Text)
instanceCount :: Maybe (Value Integer)
instanceType :: Maybe (Value Text)
warmCount :: Maybe (Value Integer)
warmEnabled :: Maybe (Value Bool)
warmType :: Maybe (Value Text)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: Maybe (Value Bool)
..}
    = ElasticsearchClusterConfigProperty
        {warmCount :: Maybe (Value Integer)
warmCount = Value Integer -> Maybe (Value Integer)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "WarmCount" ElasticsearchClusterConfigProperty
Value Integer
newValue, Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe ColdStorageOptionsProperty
Maybe ZoneAwarenessConfigProperty
()
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterType :: Maybe (Value Text)
instanceCount :: Maybe (Value Integer)
instanceType :: Maybe (Value Text)
warmEnabled :: Maybe (Value Bool)
warmType :: Maybe (Value Text)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: Maybe (Value Bool)
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterType :: Maybe (Value Text)
instanceCount :: Maybe (Value Integer)
instanceType :: Maybe (Value Text)
warmEnabled :: Maybe (Value Bool)
warmType :: Maybe (Value Text)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: Maybe (Value Bool)
..}
instance Property "WarmEnabled" ElasticsearchClusterConfigProperty where
  type PropertyType "WarmEnabled" ElasticsearchClusterConfigProperty = Value Prelude.Bool
  set :: PropertyType "WarmEnabled" ElasticsearchClusterConfigProperty
-> ElasticsearchClusterConfigProperty
-> ElasticsearchClusterConfigProperty
set PropertyType "WarmEnabled" ElasticsearchClusterConfigProperty
newValue ElasticsearchClusterConfigProperty {Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe ColdStorageOptionsProperty
Maybe ZoneAwarenessConfigProperty
()
haddock_workaround_ :: ElasticsearchClusterConfigProperty -> ()
coldStorageOptions :: ElasticsearchClusterConfigProperty
-> Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
dedicatedMasterEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
dedicatedMasterType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
instanceCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
instanceType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
warmCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
warmEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
warmType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
zoneAwarenessConfig :: ElasticsearchClusterConfigProperty
-> Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterType :: Maybe (Value Text)
instanceCount :: Maybe (Value Integer)
instanceType :: Maybe (Value Text)
warmCount :: Maybe (Value Integer)
warmEnabled :: Maybe (Value Bool)
warmType :: Maybe (Value Text)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: Maybe (Value Bool)
..}
    = ElasticsearchClusterConfigProperty
        {warmEnabled :: Maybe (Value Bool)
warmEnabled = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "WarmEnabled" ElasticsearchClusterConfigProperty
Value Bool
newValue, Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe ColdStorageOptionsProperty
Maybe ZoneAwarenessConfigProperty
()
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterType :: Maybe (Value Text)
instanceCount :: Maybe (Value Integer)
instanceType :: Maybe (Value Text)
warmCount :: Maybe (Value Integer)
warmType :: Maybe (Value Text)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: Maybe (Value Bool)
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterType :: Maybe (Value Text)
instanceCount :: Maybe (Value Integer)
instanceType :: Maybe (Value Text)
warmCount :: Maybe (Value Integer)
warmType :: Maybe (Value Text)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: Maybe (Value Bool)
..}
instance Property "WarmType" ElasticsearchClusterConfigProperty where
  type PropertyType "WarmType" ElasticsearchClusterConfigProperty = Value Prelude.Text
  set :: PropertyType "WarmType" ElasticsearchClusterConfigProperty
-> ElasticsearchClusterConfigProperty
-> ElasticsearchClusterConfigProperty
set PropertyType "WarmType" ElasticsearchClusterConfigProperty
newValue ElasticsearchClusterConfigProperty {Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe ColdStorageOptionsProperty
Maybe ZoneAwarenessConfigProperty
()
haddock_workaround_ :: ElasticsearchClusterConfigProperty -> ()
coldStorageOptions :: ElasticsearchClusterConfigProperty
-> Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
dedicatedMasterEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
dedicatedMasterType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
instanceCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
instanceType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
warmCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
warmEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
warmType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
zoneAwarenessConfig :: ElasticsearchClusterConfigProperty
-> Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterType :: Maybe (Value Text)
instanceCount :: Maybe (Value Integer)
instanceType :: Maybe (Value Text)
warmCount :: Maybe (Value Integer)
warmEnabled :: Maybe (Value Bool)
warmType :: Maybe (Value Text)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: Maybe (Value Bool)
..}
    = ElasticsearchClusterConfigProperty
        {warmType :: Maybe (Value Text)
warmType = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "WarmType" ElasticsearchClusterConfigProperty
Value Text
newValue, Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe ColdStorageOptionsProperty
Maybe ZoneAwarenessConfigProperty
()
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterType :: Maybe (Value Text)
instanceCount :: Maybe (Value Integer)
instanceType :: Maybe (Value Text)
warmCount :: Maybe (Value Integer)
warmEnabled :: Maybe (Value Bool)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: Maybe (Value Bool)
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterType :: Maybe (Value Text)
instanceCount :: Maybe (Value Integer)
instanceType :: Maybe (Value Text)
warmCount :: Maybe (Value Integer)
warmEnabled :: Maybe (Value Bool)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: Maybe (Value Bool)
..}
instance Property "ZoneAwarenessConfig" ElasticsearchClusterConfigProperty where
  type PropertyType "ZoneAwarenessConfig" ElasticsearchClusterConfigProperty = ZoneAwarenessConfigProperty
  set :: PropertyType
  "ZoneAwarenessConfig" ElasticsearchClusterConfigProperty
-> ElasticsearchClusterConfigProperty
-> ElasticsearchClusterConfigProperty
set PropertyType
  "ZoneAwarenessConfig" ElasticsearchClusterConfigProperty
newValue ElasticsearchClusterConfigProperty {Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe ColdStorageOptionsProperty
Maybe ZoneAwarenessConfigProperty
()
haddock_workaround_ :: ElasticsearchClusterConfigProperty -> ()
coldStorageOptions :: ElasticsearchClusterConfigProperty
-> Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
dedicatedMasterEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
dedicatedMasterType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
instanceCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
instanceType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
warmCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
warmEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
warmType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
zoneAwarenessConfig :: ElasticsearchClusterConfigProperty
-> Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterType :: Maybe (Value Text)
instanceCount :: Maybe (Value Integer)
instanceType :: Maybe (Value Text)
warmCount :: Maybe (Value Integer)
warmEnabled :: Maybe (Value Bool)
warmType :: Maybe (Value Text)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: Maybe (Value Bool)
..}
    = ElasticsearchClusterConfigProperty
        {zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessConfig = ZoneAwarenessConfigProperty -> Maybe ZoneAwarenessConfigProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
  "ZoneAwarenessConfig" ElasticsearchClusterConfigProperty
ZoneAwarenessConfigProperty
newValue, Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe ColdStorageOptionsProperty
()
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterType :: Maybe (Value Text)
instanceCount :: Maybe (Value Integer)
instanceType :: Maybe (Value Text)
warmCount :: Maybe (Value Integer)
warmEnabled :: Maybe (Value Bool)
warmType :: Maybe (Value Text)
zoneAwarenessEnabled :: Maybe (Value Bool)
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterType :: Maybe (Value Text)
instanceCount :: Maybe (Value Integer)
instanceType :: Maybe (Value Text)
warmCount :: Maybe (Value Integer)
warmEnabled :: Maybe (Value Bool)
warmType :: Maybe (Value Text)
zoneAwarenessEnabled :: Maybe (Value Bool)
..}
instance Property "ZoneAwarenessEnabled" ElasticsearchClusterConfigProperty where
  type PropertyType "ZoneAwarenessEnabled" ElasticsearchClusterConfigProperty = Value Prelude.Bool
  set :: PropertyType
  "ZoneAwarenessEnabled" ElasticsearchClusterConfigProperty
-> ElasticsearchClusterConfigProperty
-> ElasticsearchClusterConfigProperty
set PropertyType
  "ZoneAwarenessEnabled" ElasticsearchClusterConfigProperty
newValue ElasticsearchClusterConfigProperty {Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe ColdStorageOptionsProperty
Maybe ZoneAwarenessConfigProperty
()
haddock_workaround_ :: ElasticsearchClusterConfigProperty -> ()
coldStorageOptions :: ElasticsearchClusterConfigProperty
-> Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
dedicatedMasterEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
dedicatedMasterType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
instanceCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
instanceType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
warmCount :: ElasticsearchClusterConfigProperty -> Maybe (Value Integer)
warmEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
warmType :: ElasticsearchClusterConfigProperty -> Maybe (Value Text)
zoneAwarenessConfig :: ElasticsearchClusterConfigProperty
-> Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: ElasticsearchClusterConfigProperty -> Maybe (Value Bool)
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterType :: Maybe (Value Text)
instanceCount :: Maybe (Value Integer)
instanceType :: Maybe (Value Text)
warmCount :: Maybe (Value Integer)
warmEnabled :: Maybe (Value Bool)
warmType :: Maybe (Value Text)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
zoneAwarenessEnabled :: Maybe (Value Bool)
..}
    = ElasticsearchClusterConfigProperty
        {zoneAwarenessEnabled :: Maybe (Value Bool)
zoneAwarenessEnabled = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
  "ZoneAwarenessEnabled" ElasticsearchClusterConfigProperty
Value Bool
newValue, Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe ColdStorageOptionsProperty
Maybe ZoneAwarenessConfigProperty
()
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterType :: Maybe (Value Text)
instanceCount :: Maybe (Value Integer)
instanceType :: Maybe (Value Text)
warmCount :: Maybe (Value Integer)
warmEnabled :: Maybe (Value Bool)
warmType :: Maybe (Value Text)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
haddock_workaround_ :: ()
coldStorageOptions :: Maybe ColdStorageOptionsProperty
dedicatedMasterCount :: Maybe (Value Integer)
dedicatedMasterEnabled :: Maybe (Value Bool)
dedicatedMasterType :: Maybe (Value Text)
instanceCount :: Maybe (Value Integer)
instanceType :: Maybe (Value Text)
warmCount :: Maybe (Value Integer)
warmEnabled :: Maybe (Value Bool)
warmType :: Maybe (Value Text)
zoneAwarenessConfig :: Maybe ZoneAwarenessConfigProperty
..}