module Stratosphere.DynamoDB.GlobalTable.GlobalSecondaryIndexProperty (
module Exports, GlobalSecondaryIndexProperty(..),
mkGlobalSecondaryIndexProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.DynamoDB.GlobalTable.KeySchemaProperty as Exports
import {-# SOURCE #-} Stratosphere.DynamoDB.GlobalTable.ProjectionProperty as Exports
import {-# SOURCE #-} Stratosphere.DynamoDB.GlobalTable.WarmThroughputProperty as Exports
import {-# SOURCE #-} Stratosphere.DynamoDB.GlobalTable.WriteOnDemandThroughputSettingsProperty as Exports
import {-# SOURCE #-} Stratosphere.DynamoDB.GlobalTable.WriteProvisionedThroughputSettingsProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Value
data GlobalSecondaryIndexProperty
=
GlobalSecondaryIndexProperty {GlobalSecondaryIndexProperty -> ()
haddock_workaround_ :: (),
GlobalSecondaryIndexProperty -> Value Text
indexName :: (Value Prelude.Text),
GlobalSecondaryIndexProperty -> [KeySchemaProperty]
keySchema :: [KeySchemaProperty],
GlobalSecondaryIndexProperty -> ProjectionProperty
projection :: ProjectionProperty,
GlobalSecondaryIndexProperty -> Maybe WarmThroughputProperty
warmThroughput :: (Prelude.Maybe WarmThroughputProperty),
GlobalSecondaryIndexProperty
-> Maybe WriteOnDemandThroughputSettingsProperty
writeOnDemandThroughputSettings :: (Prelude.Maybe WriteOnDemandThroughputSettingsProperty),
GlobalSecondaryIndexProperty
-> Maybe WriteProvisionedThroughputSettingsProperty
writeProvisionedThroughputSettings :: (Prelude.Maybe WriteProvisionedThroughputSettingsProperty)}
deriving stock (GlobalSecondaryIndexProperty
-> GlobalSecondaryIndexProperty -> Bool
(GlobalSecondaryIndexProperty
-> GlobalSecondaryIndexProperty -> Bool)
-> (GlobalSecondaryIndexProperty
-> GlobalSecondaryIndexProperty -> Bool)
-> Eq GlobalSecondaryIndexProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: GlobalSecondaryIndexProperty
-> GlobalSecondaryIndexProperty -> Bool
== :: GlobalSecondaryIndexProperty
-> GlobalSecondaryIndexProperty -> Bool
$c/= :: GlobalSecondaryIndexProperty
-> GlobalSecondaryIndexProperty -> Bool
/= :: GlobalSecondaryIndexProperty
-> GlobalSecondaryIndexProperty -> Bool
Prelude.Eq, Int -> GlobalSecondaryIndexProperty -> ShowS
[GlobalSecondaryIndexProperty] -> ShowS
GlobalSecondaryIndexProperty -> String
(Int -> GlobalSecondaryIndexProperty -> ShowS)
-> (GlobalSecondaryIndexProperty -> String)
-> ([GlobalSecondaryIndexProperty] -> ShowS)
-> Show GlobalSecondaryIndexProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> GlobalSecondaryIndexProperty -> ShowS
showsPrec :: Int -> GlobalSecondaryIndexProperty -> ShowS
$cshow :: GlobalSecondaryIndexProperty -> String
show :: GlobalSecondaryIndexProperty -> String
$cshowList :: [GlobalSecondaryIndexProperty] -> ShowS
showList :: [GlobalSecondaryIndexProperty] -> ShowS
Prelude.Show)
mkGlobalSecondaryIndexProperty ::
Value Prelude.Text
-> [KeySchemaProperty]
-> ProjectionProperty -> GlobalSecondaryIndexProperty
mkGlobalSecondaryIndexProperty :: Value Text
-> [KeySchemaProperty]
-> ProjectionProperty
-> GlobalSecondaryIndexProperty
mkGlobalSecondaryIndexProperty Value Text
indexName [KeySchemaProperty]
keySchema ProjectionProperty
projection
= GlobalSecondaryIndexProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), indexName :: Value Text
indexName = Value Text
indexName,
keySchema :: [KeySchemaProperty]
keySchema = [KeySchemaProperty]
keySchema, projection :: ProjectionProperty
projection = ProjectionProperty
projection,
warmThroughput :: Maybe WarmThroughputProperty
warmThroughput = Maybe WarmThroughputProperty
forall a. Maybe a
Prelude.Nothing,
writeOnDemandThroughputSettings :: Maybe WriteOnDemandThroughputSettingsProperty
writeOnDemandThroughputSettings = Maybe WriteOnDemandThroughputSettingsProperty
forall a. Maybe a
Prelude.Nothing,
writeProvisionedThroughputSettings :: Maybe WriteProvisionedThroughputSettingsProperty
writeProvisionedThroughputSettings = Maybe WriteProvisionedThroughputSettingsProperty
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties GlobalSecondaryIndexProperty where
toResourceProperties :: GlobalSecondaryIndexProperty -> ResourceProperties
toResourceProperties GlobalSecondaryIndexProperty {[KeySchemaProperty]
Maybe WarmThroughputProperty
Maybe WriteOnDemandThroughputSettingsProperty
Maybe WriteProvisionedThroughputSettingsProperty
()
Value Text
ProjectionProperty
haddock_workaround_ :: GlobalSecondaryIndexProperty -> ()
indexName :: GlobalSecondaryIndexProperty -> Value Text
keySchema :: GlobalSecondaryIndexProperty -> [KeySchemaProperty]
projection :: GlobalSecondaryIndexProperty -> ProjectionProperty
warmThroughput :: GlobalSecondaryIndexProperty -> Maybe WarmThroughputProperty
writeOnDemandThroughputSettings :: GlobalSecondaryIndexProperty
-> Maybe WriteOnDemandThroughputSettingsProperty
writeProvisionedThroughputSettings :: GlobalSecondaryIndexProperty
-> Maybe WriteProvisionedThroughputSettingsProperty
haddock_workaround_ :: ()
indexName :: Value Text
keySchema :: [KeySchemaProperty]
projection :: ProjectionProperty
warmThroughput :: Maybe WarmThroughputProperty
writeOnDemandThroughputSettings :: Maybe WriteOnDemandThroughputSettingsProperty
writeProvisionedThroughputSettings :: Maybe WriteProvisionedThroughputSettingsProperty
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::DynamoDB::GlobalTable.GlobalSecondaryIndex",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Item Object] -> Object
forall l. IsList l => [Item l] -> l
Prelude.fromList
([(Key, Value)] -> [(Key, Value)] -> [(Key, Value)]
forall a. Semigroup a => a -> a -> a
(Prelude.<>)
[Key
"IndexName" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
indexName, Key
"KeySchema" Key -> [KeySchemaProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= [KeySchemaProperty]
keySchema,
Key
"Projection" Key -> ProjectionProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= ProjectionProperty
projection]
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> WarmThroughputProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"WarmThroughput" (WarmThroughputProperty -> (Key, Value))
-> Maybe WarmThroughputProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe WarmThroughputProperty
warmThroughput,
Key -> WriteOnDemandThroughputSettingsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"WriteOnDemandThroughputSettings"
(WriteOnDemandThroughputSettingsProperty -> (Key, Value))
-> Maybe WriteOnDemandThroughputSettingsProperty
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe WriteOnDemandThroughputSettingsProperty
writeOnDemandThroughputSettings,
Key -> WriteProvisionedThroughputSettingsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"WriteProvisionedThroughputSettings"
(WriteProvisionedThroughputSettingsProperty -> (Key, Value))
-> Maybe WriteProvisionedThroughputSettingsProperty
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe WriteProvisionedThroughputSettingsProperty
writeProvisionedThroughputSettings]))}
instance JSON.ToJSON GlobalSecondaryIndexProperty where
toJSON :: GlobalSecondaryIndexProperty -> Value
toJSON GlobalSecondaryIndexProperty {[KeySchemaProperty]
Maybe WarmThroughputProperty
Maybe WriteOnDemandThroughputSettingsProperty
Maybe WriteProvisionedThroughputSettingsProperty
()
Value Text
ProjectionProperty
haddock_workaround_ :: GlobalSecondaryIndexProperty -> ()
indexName :: GlobalSecondaryIndexProperty -> Value Text
keySchema :: GlobalSecondaryIndexProperty -> [KeySchemaProperty]
projection :: GlobalSecondaryIndexProperty -> ProjectionProperty
warmThroughput :: GlobalSecondaryIndexProperty -> Maybe WarmThroughputProperty
writeOnDemandThroughputSettings :: GlobalSecondaryIndexProperty
-> Maybe WriteOnDemandThroughputSettingsProperty
writeProvisionedThroughputSettings :: GlobalSecondaryIndexProperty
-> Maybe WriteProvisionedThroughputSettingsProperty
haddock_workaround_ :: ()
indexName :: Value Text
keySchema :: [KeySchemaProperty]
projection :: ProjectionProperty
warmThroughput :: Maybe WarmThroughputProperty
writeOnDemandThroughputSettings :: Maybe WriteOnDemandThroughputSettingsProperty
writeProvisionedThroughputSettings :: Maybe WriteProvisionedThroughputSettingsProperty
..}
= [(Key, Value)] -> Value
JSON.object
([Item [(Key, Value)]] -> [(Key, Value)]
forall l. IsList l => [Item l] -> l
Prelude.fromList
([(Key, Value)] -> [(Key, Value)] -> [(Key, Value)]
forall a. Semigroup a => a -> a -> a
(Prelude.<>)
[Key
"IndexName" Key -> Value Text -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= Value Text
indexName, Key
"KeySchema" Key -> [KeySchemaProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= [KeySchemaProperty]
keySchema,
Key
"Projection" Key -> ProjectionProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= ProjectionProperty
projection]
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> WarmThroughputProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"WarmThroughput" (WarmThroughputProperty -> (Key, Value))
-> Maybe WarmThroughputProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe WarmThroughputProperty
warmThroughput,
Key -> WriteOnDemandThroughputSettingsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"WriteOnDemandThroughputSettings"
(WriteOnDemandThroughputSettingsProperty -> (Key, Value))
-> Maybe WriteOnDemandThroughputSettingsProperty
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe WriteOnDemandThroughputSettingsProperty
writeOnDemandThroughputSettings,
Key -> WriteProvisionedThroughputSettingsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"WriteProvisionedThroughputSettings"
(WriteProvisionedThroughputSettingsProperty -> (Key, Value))
-> Maybe WriteProvisionedThroughputSettingsProperty
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe WriteProvisionedThroughputSettingsProperty
writeProvisionedThroughputSettings])))
instance Property "IndexName" GlobalSecondaryIndexProperty where
type PropertyType "IndexName" GlobalSecondaryIndexProperty = Value Prelude.Text
set :: PropertyType "IndexName" GlobalSecondaryIndexProperty
-> GlobalSecondaryIndexProperty -> GlobalSecondaryIndexProperty
set PropertyType "IndexName" GlobalSecondaryIndexProperty
newValue GlobalSecondaryIndexProperty {[KeySchemaProperty]
Maybe WarmThroughputProperty
Maybe WriteOnDemandThroughputSettingsProperty
Maybe WriteProvisionedThroughputSettingsProperty
()
Value Text
ProjectionProperty
haddock_workaround_ :: GlobalSecondaryIndexProperty -> ()
indexName :: GlobalSecondaryIndexProperty -> Value Text
keySchema :: GlobalSecondaryIndexProperty -> [KeySchemaProperty]
projection :: GlobalSecondaryIndexProperty -> ProjectionProperty
warmThroughput :: GlobalSecondaryIndexProperty -> Maybe WarmThroughputProperty
writeOnDemandThroughputSettings :: GlobalSecondaryIndexProperty
-> Maybe WriteOnDemandThroughputSettingsProperty
writeProvisionedThroughputSettings :: GlobalSecondaryIndexProperty
-> Maybe WriteProvisionedThroughputSettingsProperty
haddock_workaround_ :: ()
indexName :: Value Text
keySchema :: [KeySchemaProperty]
projection :: ProjectionProperty
warmThroughput :: Maybe WarmThroughputProperty
writeOnDemandThroughputSettings :: Maybe WriteOnDemandThroughputSettingsProperty
writeProvisionedThroughputSettings :: Maybe WriteProvisionedThroughputSettingsProperty
..}
= GlobalSecondaryIndexProperty {indexName :: Value Text
indexName = PropertyType "IndexName" GlobalSecondaryIndexProperty
Value Text
newValue, [KeySchemaProperty]
Maybe WarmThroughputProperty
Maybe WriteOnDemandThroughputSettingsProperty
Maybe WriteProvisionedThroughputSettingsProperty
()
ProjectionProperty
haddock_workaround_ :: ()
keySchema :: [KeySchemaProperty]
projection :: ProjectionProperty
warmThroughput :: Maybe WarmThroughputProperty
writeOnDemandThroughputSettings :: Maybe WriteOnDemandThroughputSettingsProperty
writeProvisionedThroughputSettings :: Maybe WriteProvisionedThroughputSettingsProperty
haddock_workaround_ :: ()
keySchema :: [KeySchemaProperty]
projection :: ProjectionProperty
warmThroughput :: Maybe WarmThroughputProperty
writeOnDemandThroughputSettings :: Maybe WriteOnDemandThroughputSettingsProperty
writeProvisionedThroughputSettings :: Maybe WriteProvisionedThroughputSettingsProperty
..}
instance Property "KeySchema" GlobalSecondaryIndexProperty where
type PropertyType "KeySchema" GlobalSecondaryIndexProperty = [KeySchemaProperty]
set :: PropertyType "KeySchema" GlobalSecondaryIndexProperty
-> GlobalSecondaryIndexProperty -> GlobalSecondaryIndexProperty
set PropertyType "KeySchema" GlobalSecondaryIndexProperty
newValue GlobalSecondaryIndexProperty {[KeySchemaProperty]
Maybe WarmThroughputProperty
Maybe WriteOnDemandThroughputSettingsProperty
Maybe WriteProvisionedThroughputSettingsProperty
()
Value Text
ProjectionProperty
haddock_workaround_ :: GlobalSecondaryIndexProperty -> ()
indexName :: GlobalSecondaryIndexProperty -> Value Text
keySchema :: GlobalSecondaryIndexProperty -> [KeySchemaProperty]
projection :: GlobalSecondaryIndexProperty -> ProjectionProperty
warmThroughput :: GlobalSecondaryIndexProperty -> Maybe WarmThroughputProperty
writeOnDemandThroughputSettings :: GlobalSecondaryIndexProperty
-> Maybe WriteOnDemandThroughputSettingsProperty
writeProvisionedThroughputSettings :: GlobalSecondaryIndexProperty
-> Maybe WriteProvisionedThroughputSettingsProperty
haddock_workaround_ :: ()
indexName :: Value Text
keySchema :: [KeySchemaProperty]
projection :: ProjectionProperty
warmThroughput :: Maybe WarmThroughputProperty
writeOnDemandThroughputSettings :: Maybe WriteOnDemandThroughputSettingsProperty
writeProvisionedThroughputSettings :: Maybe WriteProvisionedThroughputSettingsProperty
..}
= GlobalSecondaryIndexProperty {keySchema :: [KeySchemaProperty]
keySchema = [KeySchemaProperty]
PropertyType "KeySchema" GlobalSecondaryIndexProperty
newValue, Maybe WarmThroughputProperty
Maybe WriteOnDemandThroughputSettingsProperty
Maybe WriteProvisionedThroughputSettingsProperty
()
Value Text
ProjectionProperty
haddock_workaround_ :: ()
indexName :: Value Text
projection :: ProjectionProperty
warmThroughput :: Maybe WarmThroughputProperty
writeOnDemandThroughputSettings :: Maybe WriteOnDemandThroughputSettingsProperty
writeProvisionedThroughputSettings :: Maybe WriteProvisionedThroughputSettingsProperty
haddock_workaround_ :: ()
indexName :: Value Text
projection :: ProjectionProperty
warmThroughput :: Maybe WarmThroughputProperty
writeOnDemandThroughputSettings :: Maybe WriteOnDemandThroughputSettingsProperty
writeProvisionedThroughputSettings :: Maybe WriteProvisionedThroughputSettingsProperty
..}
instance Property "Projection" GlobalSecondaryIndexProperty where
type PropertyType "Projection" GlobalSecondaryIndexProperty = ProjectionProperty
set :: PropertyType "Projection" GlobalSecondaryIndexProperty
-> GlobalSecondaryIndexProperty -> GlobalSecondaryIndexProperty
set PropertyType "Projection" GlobalSecondaryIndexProperty
newValue GlobalSecondaryIndexProperty {[KeySchemaProperty]
Maybe WarmThroughputProperty
Maybe WriteOnDemandThroughputSettingsProperty
Maybe WriteProvisionedThroughputSettingsProperty
()
Value Text
ProjectionProperty
haddock_workaround_ :: GlobalSecondaryIndexProperty -> ()
indexName :: GlobalSecondaryIndexProperty -> Value Text
keySchema :: GlobalSecondaryIndexProperty -> [KeySchemaProperty]
projection :: GlobalSecondaryIndexProperty -> ProjectionProperty
warmThroughput :: GlobalSecondaryIndexProperty -> Maybe WarmThroughputProperty
writeOnDemandThroughputSettings :: GlobalSecondaryIndexProperty
-> Maybe WriteOnDemandThroughputSettingsProperty
writeProvisionedThroughputSettings :: GlobalSecondaryIndexProperty
-> Maybe WriteProvisionedThroughputSettingsProperty
haddock_workaround_ :: ()
indexName :: Value Text
keySchema :: [KeySchemaProperty]
projection :: ProjectionProperty
warmThroughput :: Maybe WarmThroughputProperty
writeOnDemandThroughputSettings :: Maybe WriteOnDemandThroughputSettingsProperty
writeProvisionedThroughputSettings :: Maybe WriteProvisionedThroughputSettingsProperty
..}
= GlobalSecondaryIndexProperty {projection :: ProjectionProperty
projection = PropertyType "Projection" GlobalSecondaryIndexProperty
ProjectionProperty
newValue, [KeySchemaProperty]
Maybe WarmThroughputProperty
Maybe WriteOnDemandThroughputSettingsProperty
Maybe WriteProvisionedThroughputSettingsProperty
()
Value Text
haddock_workaround_ :: ()
indexName :: Value Text
keySchema :: [KeySchemaProperty]
warmThroughput :: Maybe WarmThroughputProperty
writeOnDemandThroughputSettings :: Maybe WriteOnDemandThroughputSettingsProperty
writeProvisionedThroughputSettings :: Maybe WriteProvisionedThroughputSettingsProperty
haddock_workaround_ :: ()
indexName :: Value Text
keySchema :: [KeySchemaProperty]
warmThroughput :: Maybe WarmThroughputProperty
writeOnDemandThroughputSettings :: Maybe WriteOnDemandThroughputSettingsProperty
writeProvisionedThroughputSettings :: Maybe WriteProvisionedThroughputSettingsProperty
..}
instance Property "WarmThroughput" GlobalSecondaryIndexProperty where
type PropertyType "WarmThroughput" GlobalSecondaryIndexProperty = WarmThroughputProperty
set :: PropertyType "WarmThroughput" GlobalSecondaryIndexProperty
-> GlobalSecondaryIndexProperty -> GlobalSecondaryIndexProperty
set PropertyType "WarmThroughput" GlobalSecondaryIndexProperty
newValue GlobalSecondaryIndexProperty {[KeySchemaProperty]
Maybe WarmThroughputProperty
Maybe WriteOnDemandThroughputSettingsProperty
Maybe WriteProvisionedThroughputSettingsProperty
()
Value Text
ProjectionProperty
haddock_workaround_ :: GlobalSecondaryIndexProperty -> ()
indexName :: GlobalSecondaryIndexProperty -> Value Text
keySchema :: GlobalSecondaryIndexProperty -> [KeySchemaProperty]
projection :: GlobalSecondaryIndexProperty -> ProjectionProperty
warmThroughput :: GlobalSecondaryIndexProperty -> Maybe WarmThroughputProperty
writeOnDemandThroughputSettings :: GlobalSecondaryIndexProperty
-> Maybe WriteOnDemandThroughputSettingsProperty
writeProvisionedThroughputSettings :: GlobalSecondaryIndexProperty
-> Maybe WriteProvisionedThroughputSettingsProperty
haddock_workaround_ :: ()
indexName :: Value Text
keySchema :: [KeySchemaProperty]
projection :: ProjectionProperty
warmThroughput :: Maybe WarmThroughputProperty
writeOnDemandThroughputSettings :: Maybe WriteOnDemandThroughputSettingsProperty
writeProvisionedThroughputSettings :: Maybe WriteProvisionedThroughputSettingsProperty
..}
= GlobalSecondaryIndexProperty
{warmThroughput :: Maybe WarmThroughputProperty
warmThroughput = WarmThroughputProperty -> Maybe WarmThroughputProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "WarmThroughput" GlobalSecondaryIndexProperty
WarmThroughputProperty
newValue, [KeySchemaProperty]
Maybe WriteOnDemandThroughputSettingsProperty
Maybe WriteProvisionedThroughputSettingsProperty
()
Value Text
ProjectionProperty
haddock_workaround_ :: ()
indexName :: Value Text
keySchema :: [KeySchemaProperty]
projection :: ProjectionProperty
writeOnDemandThroughputSettings :: Maybe WriteOnDemandThroughputSettingsProperty
writeProvisionedThroughputSettings :: Maybe WriteProvisionedThroughputSettingsProperty
haddock_workaround_ :: ()
indexName :: Value Text
keySchema :: [KeySchemaProperty]
projection :: ProjectionProperty
writeOnDemandThroughputSettings :: Maybe WriteOnDemandThroughputSettingsProperty
writeProvisionedThroughputSettings :: Maybe WriteProvisionedThroughputSettingsProperty
..}
instance Property "WriteOnDemandThroughputSettings" GlobalSecondaryIndexProperty where
type PropertyType "WriteOnDemandThroughputSettings" GlobalSecondaryIndexProperty = WriteOnDemandThroughputSettingsProperty
set :: PropertyType
"WriteOnDemandThroughputSettings" GlobalSecondaryIndexProperty
-> GlobalSecondaryIndexProperty -> GlobalSecondaryIndexProperty
set PropertyType
"WriteOnDemandThroughputSettings" GlobalSecondaryIndexProperty
newValue GlobalSecondaryIndexProperty {[KeySchemaProperty]
Maybe WarmThroughputProperty
Maybe WriteOnDemandThroughputSettingsProperty
Maybe WriteProvisionedThroughputSettingsProperty
()
Value Text
ProjectionProperty
haddock_workaround_ :: GlobalSecondaryIndexProperty -> ()
indexName :: GlobalSecondaryIndexProperty -> Value Text
keySchema :: GlobalSecondaryIndexProperty -> [KeySchemaProperty]
projection :: GlobalSecondaryIndexProperty -> ProjectionProperty
warmThroughput :: GlobalSecondaryIndexProperty -> Maybe WarmThroughputProperty
writeOnDemandThroughputSettings :: GlobalSecondaryIndexProperty
-> Maybe WriteOnDemandThroughputSettingsProperty
writeProvisionedThroughputSettings :: GlobalSecondaryIndexProperty
-> Maybe WriteProvisionedThroughputSettingsProperty
haddock_workaround_ :: ()
indexName :: Value Text
keySchema :: [KeySchemaProperty]
projection :: ProjectionProperty
warmThroughput :: Maybe WarmThroughputProperty
writeOnDemandThroughputSettings :: Maybe WriteOnDemandThroughputSettingsProperty
writeProvisionedThroughputSettings :: Maybe WriteProvisionedThroughputSettingsProperty
..}
= GlobalSecondaryIndexProperty
{writeOnDemandThroughputSettings :: Maybe WriteOnDemandThroughputSettingsProperty
writeOnDemandThroughputSettings = WriteOnDemandThroughputSettingsProperty
-> Maybe WriteOnDemandThroughputSettingsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
"WriteOnDemandThroughputSettings" GlobalSecondaryIndexProperty
WriteOnDemandThroughputSettingsProperty
newValue, [KeySchemaProperty]
Maybe WarmThroughputProperty
Maybe WriteProvisionedThroughputSettingsProperty
()
Value Text
ProjectionProperty
haddock_workaround_ :: ()
indexName :: Value Text
keySchema :: [KeySchemaProperty]
projection :: ProjectionProperty
warmThroughput :: Maybe WarmThroughputProperty
writeProvisionedThroughputSettings :: Maybe WriteProvisionedThroughputSettingsProperty
haddock_workaround_ :: ()
indexName :: Value Text
keySchema :: [KeySchemaProperty]
projection :: ProjectionProperty
warmThroughput :: Maybe WarmThroughputProperty
writeProvisionedThroughputSettings :: Maybe WriteProvisionedThroughputSettingsProperty
..}
instance Property "WriteProvisionedThroughputSettings" GlobalSecondaryIndexProperty where
type PropertyType "WriteProvisionedThroughputSettings" GlobalSecondaryIndexProperty = WriteProvisionedThroughputSettingsProperty
set :: PropertyType
"WriteProvisionedThroughputSettings" GlobalSecondaryIndexProperty
-> GlobalSecondaryIndexProperty -> GlobalSecondaryIndexProperty
set PropertyType
"WriteProvisionedThroughputSettings" GlobalSecondaryIndexProperty
newValue GlobalSecondaryIndexProperty {[KeySchemaProperty]
Maybe WarmThroughputProperty
Maybe WriteOnDemandThroughputSettingsProperty
Maybe WriteProvisionedThroughputSettingsProperty
()
Value Text
ProjectionProperty
haddock_workaround_ :: GlobalSecondaryIndexProperty -> ()
indexName :: GlobalSecondaryIndexProperty -> Value Text
keySchema :: GlobalSecondaryIndexProperty -> [KeySchemaProperty]
projection :: GlobalSecondaryIndexProperty -> ProjectionProperty
warmThroughput :: GlobalSecondaryIndexProperty -> Maybe WarmThroughputProperty
writeOnDemandThroughputSettings :: GlobalSecondaryIndexProperty
-> Maybe WriteOnDemandThroughputSettingsProperty
writeProvisionedThroughputSettings :: GlobalSecondaryIndexProperty
-> Maybe WriteProvisionedThroughputSettingsProperty
haddock_workaround_ :: ()
indexName :: Value Text
keySchema :: [KeySchemaProperty]
projection :: ProjectionProperty
warmThroughput :: Maybe WarmThroughputProperty
writeOnDemandThroughputSettings :: Maybe WriteOnDemandThroughputSettingsProperty
writeProvisionedThroughputSettings :: Maybe WriteProvisionedThroughputSettingsProperty
..}
= GlobalSecondaryIndexProperty
{writeProvisionedThroughputSettings :: Maybe WriteProvisionedThroughputSettingsProperty
writeProvisionedThroughputSettings = WriteProvisionedThroughputSettingsProperty
-> Maybe WriteProvisionedThroughputSettingsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
"WriteProvisionedThroughputSettings" GlobalSecondaryIndexProperty
WriteProvisionedThroughputSettingsProperty
newValue, [KeySchemaProperty]
Maybe WarmThroughputProperty
Maybe WriteOnDemandThroughputSettingsProperty
()
Value Text
ProjectionProperty
haddock_workaround_ :: ()
indexName :: Value Text
keySchema :: [KeySchemaProperty]
projection :: ProjectionProperty
warmThroughput :: Maybe WarmThroughputProperty
writeOnDemandThroughputSettings :: Maybe WriteOnDemandThroughputSettingsProperty
haddock_workaround_ :: ()
indexName :: Value Text
keySchema :: [KeySchemaProperty]
projection :: ProjectionProperty
warmThroughput :: Maybe WarmThroughputProperty
writeOnDemandThroughputSettings :: Maybe WriteOnDemandThroughputSettingsProperty
..}