module Stratosphere.DynamoDB.Table.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.Table.ContributorInsightsSpecificationProperty as Exports
import {-# SOURCE #-} Stratosphere.DynamoDB.Table.KeySchemaProperty as Exports
import {-# SOURCE #-} Stratosphere.DynamoDB.Table.OnDemandThroughputProperty as Exports
import {-# SOURCE #-} Stratosphere.DynamoDB.Table.ProjectionProperty as Exports
import {-# SOURCE #-} Stratosphere.DynamoDB.Table.ProvisionedThroughputProperty as Exports
import {-# SOURCE #-} Stratosphere.DynamoDB.Table.WarmThroughputProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Value
data GlobalSecondaryIndexProperty
=
GlobalSecondaryIndexProperty {GlobalSecondaryIndexProperty -> ()
haddock_workaround_ :: (),
GlobalSecondaryIndexProperty
-> Maybe ContributorInsightsSpecificationProperty
contributorInsightsSpecification :: (Prelude.Maybe ContributorInsightsSpecificationProperty),
GlobalSecondaryIndexProperty -> Value Text
indexName :: (Value Prelude.Text),
GlobalSecondaryIndexProperty -> [KeySchemaProperty]
keySchema :: [KeySchemaProperty],
GlobalSecondaryIndexProperty -> Maybe OnDemandThroughputProperty
onDemandThroughput :: (Prelude.Maybe OnDemandThroughputProperty),
GlobalSecondaryIndexProperty -> ProjectionProperty
projection :: ProjectionProperty,
GlobalSecondaryIndexProperty -> Maybe ProvisionedThroughputProperty
provisionedThroughput :: (Prelude.Maybe ProvisionedThroughputProperty),
GlobalSecondaryIndexProperty -> Maybe WarmThroughputProperty
warmThroughput :: (Prelude.Maybe WarmThroughputProperty)}
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,
contributorInsightsSpecification :: Maybe ContributorInsightsSpecificationProperty
contributorInsightsSpecification = Maybe ContributorInsightsSpecificationProperty
forall a. Maybe a
Prelude.Nothing,
onDemandThroughput :: Maybe OnDemandThroughputProperty
onDemandThroughput = Maybe OnDemandThroughputProperty
forall a. Maybe a
Prelude.Nothing,
provisionedThroughput :: Maybe ProvisionedThroughputProperty
provisionedThroughput = Maybe ProvisionedThroughputProperty
forall a. Maybe a
Prelude.Nothing,
warmThroughput :: Maybe WarmThroughputProperty
warmThroughput = Maybe WarmThroughputProperty
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties GlobalSecondaryIndexProperty where
toResourceProperties :: GlobalSecondaryIndexProperty -> ResourceProperties
toResourceProperties GlobalSecondaryIndexProperty {[KeySchemaProperty]
Maybe ContributorInsightsSpecificationProperty
Maybe OnDemandThroughputProperty
Maybe ProvisionedThroughputProperty
Maybe WarmThroughputProperty
()
Value Text
ProjectionProperty
haddock_workaround_ :: GlobalSecondaryIndexProperty -> ()
contributorInsightsSpecification :: GlobalSecondaryIndexProperty
-> Maybe ContributorInsightsSpecificationProperty
indexName :: GlobalSecondaryIndexProperty -> Value Text
keySchema :: GlobalSecondaryIndexProperty -> [KeySchemaProperty]
onDemandThroughput :: GlobalSecondaryIndexProperty -> Maybe OnDemandThroughputProperty
projection :: GlobalSecondaryIndexProperty -> ProjectionProperty
provisionedThroughput :: GlobalSecondaryIndexProperty -> Maybe ProvisionedThroughputProperty
warmThroughput :: GlobalSecondaryIndexProperty -> Maybe WarmThroughputProperty
haddock_workaround_ :: ()
contributorInsightsSpecification :: Maybe ContributorInsightsSpecificationProperty
indexName :: Value Text
keySchema :: [KeySchemaProperty]
onDemandThroughput :: Maybe OnDemandThroughputProperty
projection :: ProjectionProperty
provisionedThroughput :: Maybe ProvisionedThroughputProperty
warmThroughput :: Maybe WarmThroughputProperty
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::DynamoDB::Table.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 -> ContributorInsightsSpecificationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ContributorInsightsSpecification"
(ContributorInsightsSpecificationProperty -> (Key, Value))
-> Maybe ContributorInsightsSpecificationProperty
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ContributorInsightsSpecificationProperty
contributorInsightsSpecification,
Key -> OnDemandThroughputProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"OnDemandThroughput" (OnDemandThroughputProperty -> (Key, Value))
-> Maybe OnDemandThroughputProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe OnDemandThroughputProperty
onDemandThroughput,
Key -> ProvisionedThroughputProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ProvisionedThroughput"
(ProvisionedThroughputProperty -> (Key, Value))
-> Maybe ProvisionedThroughputProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ProvisionedThroughputProperty
provisionedThroughput,
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]))}
instance JSON.ToJSON GlobalSecondaryIndexProperty where
toJSON :: GlobalSecondaryIndexProperty -> Value
toJSON GlobalSecondaryIndexProperty {[KeySchemaProperty]
Maybe ContributorInsightsSpecificationProperty
Maybe OnDemandThroughputProperty
Maybe ProvisionedThroughputProperty
Maybe WarmThroughputProperty
()
Value Text
ProjectionProperty
haddock_workaround_ :: GlobalSecondaryIndexProperty -> ()
contributorInsightsSpecification :: GlobalSecondaryIndexProperty
-> Maybe ContributorInsightsSpecificationProperty
indexName :: GlobalSecondaryIndexProperty -> Value Text
keySchema :: GlobalSecondaryIndexProperty -> [KeySchemaProperty]
onDemandThroughput :: GlobalSecondaryIndexProperty -> Maybe OnDemandThroughputProperty
projection :: GlobalSecondaryIndexProperty -> ProjectionProperty
provisionedThroughput :: GlobalSecondaryIndexProperty -> Maybe ProvisionedThroughputProperty
warmThroughput :: GlobalSecondaryIndexProperty -> Maybe WarmThroughputProperty
haddock_workaround_ :: ()
contributorInsightsSpecification :: Maybe ContributorInsightsSpecificationProperty
indexName :: Value Text
keySchema :: [KeySchemaProperty]
onDemandThroughput :: Maybe OnDemandThroughputProperty
projection :: ProjectionProperty
provisionedThroughput :: Maybe ProvisionedThroughputProperty
warmThroughput :: Maybe WarmThroughputProperty
..}
= [(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 -> ContributorInsightsSpecificationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ContributorInsightsSpecification"
(ContributorInsightsSpecificationProperty -> (Key, Value))
-> Maybe ContributorInsightsSpecificationProperty
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ContributorInsightsSpecificationProperty
contributorInsightsSpecification,
Key -> OnDemandThroughputProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"OnDemandThroughput" (OnDemandThroughputProperty -> (Key, Value))
-> Maybe OnDemandThroughputProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe OnDemandThroughputProperty
onDemandThroughput,
Key -> ProvisionedThroughputProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ProvisionedThroughput"
(ProvisionedThroughputProperty -> (Key, Value))
-> Maybe ProvisionedThroughputProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ProvisionedThroughputProperty
provisionedThroughput,
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])))
instance Property "ContributorInsightsSpecification" GlobalSecondaryIndexProperty where
type PropertyType "ContributorInsightsSpecification" GlobalSecondaryIndexProperty = ContributorInsightsSpecificationProperty
set :: PropertyType
"ContributorInsightsSpecification" GlobalSecondaryIndexProperty
-> GlobalSecondaryIndexProperty -> GlobalSecondaryIndexProperty
set PropertyType
"ContributorInsightsSpecification" GlobalSecondaryIndexProperty
newValue GlobalSecondaryIndexProperty {[KeySchemaProperty]
Maybe ContributorInsightsSpecificationProperty
Maybe OnDemandThroughputProperty
Maybe ProvisionedThroughputProperty
Maybe WarmThroughputProperty
()
Value Text
ProjectionProperty
haddock_workaround_ :: GlobalSecondaryIndexProperty -> ()
contributorInsightsSpecification :: GlobalSecondaryIndexProperty
-> Maybe ContributorInsightsSpecificationProperty
indexName :: GlobalSecondaryIndexProperty -> Value Text
keySchema :: GlobalSecondaryIndexProperty -> [KeySchemaProperty]
onDemandThroughput :: GlobalSecondaryIndexProperty -> Maybe OnDemandThroughputProperty
projection :: GlobalSecondaryIndexProperty -> ProjectionProperty
provisionedThroughput :: GlobalSecondaryIndexProperty -> Maybe ProvisionedThroughputProperty
warmThroughput :: GlobalSecondaryIndexProperty -> Maybe WarmThroughputProperty
haddock_workaround_ :: ()
contributorInsightsSpecification :: Maybe ContributorInsightsSpecificationProperty
indexName :: Value Text
keySchema :: [KeySchemaProperty]
onDemandThroughput :: Maybe OnDemandThroughputProperty
projection :: ProjectionProperty
provisionedThroughput :: Maybe ProvisionedThroughputProperty
warmThroughput :: Maybe WarmThroughputProperty
..}
= GlobalSecondaryIndexProperty
{contributorInsightsSpecification :: Maybe ContributorInsightsSpecificationProperty
contributorInsightsSpecification = ContributorInsightsSpecificationProperty
-> Maybe ContributorInsightsSpecificationProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
"ContributorInsightsSpecification" GlobalSecondaryIndexProperty
ContributorInsightsSpecificationProperty
newValue, [KeySchemaProperty]
Maybe OnDemandThroughputProperty
Maybe ProvisionedThroughputProperty
Maybe WarmThroughputProperty
()
Value Text
ProjectionProperty
haddock_workaround_ :: ()
indexName :: Value Text
keySchema :: [KeySchemaProperty]
onDemandThroughput :: Maybe OnDemandThroughputProperty
projection :: ProjectionProperty
provisionedThroughput :: Maybe ProvisionedThroughputProperty
warmThroughput :: Maybe WarmThroughputProperty
haddock_workaround_ :: ()
indexName :: Value Text
keySchema :: [KeySchemaProperty]
onDemandThroughput :: Maybe OnDemandThroughputProperty
projection :: ProjectionProperty
provisionedThroughput :: Maybe ProvisionedThroughputProperty
warmThroughput :: Maybe WarmThroughputProperty
..}
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 ContributorInsightsSpecificationProperty
Maybe OnDemandThroughputProperty
Maybe ProvisionedThroughputProperty
Maybe WarmThroughputProperty
()
Value Text
ProjectionProperty
haddock_workaround_ :: GlobalSecondaryIndexProperty -> ()
contributorInsightsSpecification :: GlobalSecondaryIndexProperty
-> Maybe ContributorInsightsSpecificationProperty
indexName :: GlobalSecondaryIndexProperty -> Value Text
keySchema :: GlobalSecondaryIndexProperty -> [KeySchemaProperty]
onDemandThroughput :: GlobalSecondaryIndexProperty -> Maybe OnDemandThroughputProperty
projection :: GlobalSecondaryIndexProperty -> ProjectionProperty
provisionedThroughput :: GlobalSecondaryIndexProperty -> Maybe ProvisionedThroughputProperty
warmThroughput :: GlobalSecondaryIndexProperty -> Maybe WarmThroughputProperty
haddock_workaround_ :: ()
contributorInsightsSpecification :: Maybe ContributorInsightsSpecificationProperty
indexName :: Value Text
keySchema :: [KeySchemaProperty]
onDemandThroughput :: Maybe OnDemandThroughputProperty
projection :: ProjectionProperty
provisionedThroughput :: Maybe ProvisionedThroughputProperty
warmThroughput :: Maybe WarmThroughputProperty
..}
= GlobalSecondaryIndexProperty {indexName :: Value Text
indexName = PropertyType "IndexName" GlobalSecondaryIndexProperty
Value Text
newValue, [KeySchemaProperty]
Maybe ContributorInsightsSpecificationProperty
Maybe OnDemandThroughputProperty
Maybe ProvisionedThroughputProperty
Maybe WarmThroughputProperty
()
ProjectionProperty
haddock_workaround_ :: ()
contributorInsightsSpecification :: Maybe ContributorInsightsSpecificationProperty
keySchema :: [KeySchemaProperty]
onDemandThroughput :: Maybe OnDemandThroughputProperty
projection :: ProjectionProperty
provisionedThroughput :: Maybe ProvisionedThroughputProperty
warmThroughput :: Maybe WarmThroughputProperty
haddock_workaround_ :: ()
contributorInsightsSpecification :: Maybe ContributorInsightsSpecificationProperty
keySchema :: [KeySchemaProperty]
onDemandThroughput :: Maybe OnDemandThroughputProperty
projection :: ProjectionProperty
provisionedThroughput :: Maybe ProvisionedThroughputProperty
warmThroughput :: Maybe WarmThroughputProperty
..}
instance Property "KeySchema" GlobalSecondaryIndexProperty where
type PropertyType "KeySchema" GlobalSecondaryIndexProperty = [KeySchemaProperty]
set :: PropertyType "KeySchema" GlobalSecondaryIndexProperty
-> GlobalSecondaryIndexProperty -> GlobalSecondaryIndexProperty
set PropertyType "KeySchema" GlobalSecondaryIndexProperty
newValue GlobalSecondaryIndexProperty {[KeySchemaProperty]
Maybe ContributorInsightsSpecificationProperty
Maybe OnDemandThroughputProperty
Maybe ProvisionedThroughputProperty
Maybe WarmThroughputProperty
()
Value Text
ProjectionProperty
haddock_workaround_ :: GlobalSecondaryIndexProperty -> ()
contributorInsightsSpecification :: GlobalSecondaryIndexProperty
-> Maybe ContributorInsightsSpecificationProperty
indexName :: GlobalSecondaryIndexProperty -> Value Text
keySchema :: GlobalSecondaryIndexProperty -> [KeySchemaProperty]
onDemandThroughput :: GlobalSecondaryIndexProperty -> Maybe OnDemandThroughputProperty
projection :: GlobalSecondaryIndexProperty -> ProjectionProperty
provisionedThroughput :: GlobalSecondaryIndexProperty -> Maybe ProvisionedThroughputProperty
warmThroughput :: GlobalSecondaryIndexProperty -> Maybe WarmThroughputProperty
haddock_workaround_ :: ()
contributorInsightsSpecification :: Maybe ContributorInsightsSpecificationProperty
indexName :: Value Text
keySchema :: [KeySchemaProperty]
onDemandThroughput :: Maybe OnDemandThroughputProperty
projection :: ProjectionProperty
provisionedThroughput :: Maybe ProvisionedThroughputProperty
warmThroughput :: Maybe WarmThroughputProperty
..}
= GlobalSecondaryIndexProperty {keySchema :: [KeySchemaProperty]
keySchema = [KeySchemaProperty]
PropertyType "KeySchema" GlobalSecondaryIndexProperty
newValue, Maybe ContributorInsightsSpecificationProperty
Maybe OnDemandThroughputProperty
Maybe ProvisionedThroughputProperty
Maybe WarmThroughputProperty
()
Value Text
ProjectionProperty
haddock_workaround_ :: ()
contributorInsightsSpecification :: Maybe ContributorInsightsSpecificationProperty
indexName :: Value Text
onDemandThroughput :: Maybe OnDemandThroughputProperty
projection :: ProjectionProperty
provisionedThroughput :: Maybe ProvisionedThroughputProperty
warmThroughput :: Maybe WarmThroughputProperty
haddock_workaround_ :: ()
contributorInsightsSpecification :: Maybe ContributorInsightsSpecificationProperty
indexName :: Value Text
onDemandThroughput :: Maybe OnDemandThroughputProperty
projection :: ProjectionProperty
provisionedThroughput :: Maybe ProvisionedThroughputProperty
warmThroughput :: Maybe WarmThroughputProperty
..}
instance Property "OnDemandThroughput" GlobalSecondaryIndexProperty where
type PropertyType "OnDemandThroughput" GlobalSecondaryIndexProperty = OnDemandThroughputProperty
set :: PropertyType "OnDemandThroughput" GlobalSecondaryIndexProperty
-> GlobalSecondaryIndexProperty -> GlobalSecondaryIndexProperty
set PropertyType "OnDemandThroughput" GlobalSecondaryIndexProperty
newValue GlobalSecondaryIndexProperty {[KeySchemaProperty]
Maybe ContributorInsightsSpecificationProperty
Maybe OnDemandThroughputProperty
Maybe ProvisionedThroughputProperty
Maybe WarmThroughputProperty
()
Value Text
ProjectionProperty
haddock_workaround_ :: GlobalSecondaryIndexProperty -> ()
contributorInsightsSpecification :: GlobalSecondaryIndexProperty
-> Maybe ContributorInsightsSpecificationProperty
indexName :: GlobalSecondaryIndexProperty -> Value Text
keySchema :: GlobalSecondaryIndexProperty -> [KeySchemaProperty]
onDemandThroughput :: GlobalSecondaryIndexProperty -> Maybe OnDemandThroughputProperty
projection :: GlobalSecondaryIndexProperty -> ProjectionProperty
provisionedThroughput :: GlobalSecondaryIndexProperty -> Maybe ProvisionedThroughputProperty
warmThroughput :: GlobalSecondaryIndexProperty -> Maybe WarmThroughputProperty
haddock_workaround_ :: ()
contributorInsightsSpecification :: Maybe ContributorInsightsSpecificationProperty
indexName :: Value Text
keySchema :: [KeySchemaProperty]
onDemandThroughput :: Maybe OnDemandThroughputProperty
projection :: ProjectionProperty
provisionedThroughput :: Maybe ProvisionedThroughputProperty
warmThroughput :: Maybe WarmThroughputProperty
..}
= GlobalSecondaryIndexProperty
{onDemandThroughput :: Maybe OnDemandThroughputProperty
onDemandThroughput = OnDemandThroughputProperty -> Maybe OnDemandThroughputProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "OnDemandThroughput" GlobalSecondaryIndexProperty
OnDemandThroughputProperty
newValue, [KeySchemaProperty]
Maybe ContributorInsightsSpecificationProperty
Maybe ProvisionedThroughputProperty
Maybe WarmThroughputProperty
()
Value Text
ProjectionProperty
haddock_workaround_ :: ()
contributorInsightsSpecification :: Maybe ContributorInsightsSpecificationProperty
indexName :: Value Text
keySchema :: [KeySchemaProperty]
projection :: ProjectionProperty
provisionedThroughput :: Maybe ProvisionedThroughputProperty
warmThroughput :: Maybe WarmThroughputProperty
haddock_workaround_ :: ()
contributorInsightsSpecification :: Maybe ContributorInsightsSpecificationProperty
indexName :: Value Text
keySchema :: [KeySchemaProperty]
projection :: ProjectionProperty
provisionedThroughput :: Maybe ProvisionedThroughputProperty
warmThroughput :: Maybe WarmThroughputProperty
..}
instance Property "Projection" GlobalSecondaryIndexProperty where
type PropertyType "Projection" GlobalSecondaryIndexProperty = ProjectionProperty
set :: PropertyType "Projection" GlobalSecondaryIndexProperty
-> GlobalSecondaryIndexProperty -> GlobalSecondaryIndexProperty
set PropertyType "Projection" GlobalSecondaryIndexProperty
newValue GlobalSecondaryIndexProperty {[KeySchemaProperty]
Maybe ContributorInsightsSpecificationProperty
Maybe OnDemandThroughputProperty
Maybe ProvisionedThroughputProperty
Maybe WarmThroughputProperty
()
Value Text
ProjectionProperty
haddock_workaround_ :: GlobalSecondaryIndexProperty -> ()
contributorInsightsSpecification :: GlobalSecondaryIndexProperty
-> Maybe ContributorInsightsSpecificationProperty
indexName :: GlobalSecondaryIndexProperty -> Value Text
keySchema :: GlobalSecondaryIndexProperty -> [KeySchemaProperty]
onDemandThroughput :: GlobalSecondaryIndexProperty -> Maybe OnDemandThroughputProperty
projection :: GlobalSecondaryIndexProperty -> ProjectionProperty
provisionedThroughput :: GlobalSecondaryIndexProperty -> Maybe ProvisionedThroughputProperty
warmThroughput :: GlobalSecondaryIndexProperty -> Maybe WarmThroughputProperty
haddock_workaround_ :: ()
contributorInsightsSpecification :: Maybe ContributorInsightsSpecificationProperty
indexName :: Value Text
keySchema :: [KeySchemaProperty]
onDemandThroughput :: Maybe OnDemandThroughputProperty
projection :: ProjectionProperty
provisionedThroughput :: Maybe ProvisionedThroughputProperty
warmThroughput :: Maybe WarmThroughputProperty
..}
= GlobalSecondaryIndexProperty {projection :: ProjectionProperty
projection = PropertyType "Projection" GlobalSecondaryIndexProperty
ProjectionProperty
newValue, [KeySchemaProperty]
Maybe ContributorInsightsSpecificationProperty
Maybe OnDemandThroughputProperty
Maybe ProvisionedThroughputProperty
Maybe WarmThroughputProperty
()
Value Text
haddock_workaround_ :: ()
contributorInsightsSpecification :: Maybe ContributorInsightsSpecificationProperty
indexName :: Value Text
keySchema :: [KeySchemaProperty]
onDemandThroughput :: Maybe OnDemandThroughputProperty
provisionedThroughput :: Maybe ProvisionedThroughputProperty
warmThroughput :: Maybe WarmThroughputProperty
haddock_workaround_ :: ()
contributorInsightsSpecification :: Maybe ContributorInsightsSpecificationProperty
indexName :: Value Text
keySchema :: [KeySchemaProperty]
onDemandThroughput :: Maybe OnDemandThroughputProperty
provisionedThroughput :: Maybe ProvisionedThroughputProperty
warmThroughput :: Maybe WarmThroughputProperty
..}
instance Property "ProvisionedThroughput" GlobalSecondaryIndexProperty where
type PropertyType "ProvisionedThroughput" GlobalSecondaryIndexProperty = ProvisionedThroughputProperty
set :: PropertyType "ProvisionedThroughput" GlobalSecondaryIndexProperty
-> GlobalSecondaryIndexProperty -> GlobalSecondaryIndexProperty
set PropertyType "ProvisionedThroughput" GlobalSecondaryIndexProperty
newValue GlobalSecondaryIndexProperty {[KeySchemaProperty]
Maybe ContributorInsightsSpecificationProperty
Maybe OnDemandThroughputProperty
Maybe ProvisionedThroughputProperty
Maybe WarmThroughputProperty
()
Value Text
ProjectionProperty
haddock_workaround_ :: GlobalSecondaryIndexProperty -> ()
contributorInsightsSpecification :: GlobalSecondaryIndexProperty
-> Maybe ContributorInsightsSpecificationProperty
indexName :: GlobalSecondaryIndexProperty -> Value Text
keySchema :: GlobalSecondaryIndexProperty -> [KeySchemaProperty]
onDemandThroughput :: GlobalSecondaryIndexProperty -> Maybe OnDemandThroughputProperty
projection :: GlobalSecondaryIndexProperty -> ProjectionProperty
provisionedThroughput :: GlobalSecondaryIndexProperty -> Maybe ProvisionedThroughputProperty
warmThroughput :: GlobalSecondaryIndexProperty -> Maybe WarmThroughputProperty
haddock_workaround_ :: ()
contributorInsightsSpecification :: Maybe ContributorInsightsSpecificationProperty
indexName :: Value Text
keySchema :: [KeySchemaProperty]
onDemandThroughput :: Maybe OnDemandThroughputProperty
projection :: ProjectionProperty
provisionedThroughput :: Maybe ProvisionedThroughputProperty
warmThroughput :: Maybe WarmThroughputProperty
..}
= GlobalSecondaryIndexProperty
{provisionedThroughput :: Maybe ProvisionedThroughputProperty
provisionedThroughput = ProvisionedThroughputProperty
-> Maybe ProvisionedThroughputProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ProvisionedThroughput" GlobalSecondaryIndexProperty
ProvisionedThroughputProperty
newValue, [KeySchemaProperty]
Maybe ContributorInsightsSpecificationProperty
Maybe OnDemandThroughputProperty
Maybe WarmThroughputProperty
()
Value Text
ProjectionProperty
haddock_workaround_ :: ()
contributorInsightsSpecification :: Maybe ContributorInsightsSpecificationProperty
indexName :: Value Text
keySchema :: [KeySchemaProperty]
onDemandThroughput :: Maybe OnDemandThroughputProperty
projection :: ProjectionProperty
warmThroughput :: Maybe WarmThroughputProperty
haddock_workaround_ :: ()
contributorInsightsSpecification :: Maybe ContributorInsightsSpecificationProperty
indexName :: Value Text
keySchema :: [KeySchemaProperty]
onDemandThroughput :: Maybe OnDemandThroughputProperty
projection :: ProjectionProperty
warmThroughput :: Maybe WarmThroughputProperty
..}
instance Property "WarmThroughput" GlobalSecondaryIndexProperty where
type PropertyType "WarmThroughput" GlobalSecondaryIndexProperty = WarmThroughputProperty
set :: PropertyType "WarmThroughput" GlobalSecondaryIndexProperty
-> GlobalSecondaryIndexProperty -> GlobalSecondaryIndexProperty
set PropertyType "WarmThroughput" GlobalSecondaryIndexProperty
newValue GlobalSecondaryIndexProperty {[KeySchemaProperty]
Maybe ContributorInsightsSpecificationProperty
Maybe OnDemandThroughputProperty
Maybe ProvisionedThroughputProperty
Maybe WarmThroughputProperty
()
Value Text
ProjectionProperty
haddock_workaround_ :: GlobalSecondaryIndexProperty -> ()
contributorInsightsSpecification :: GlobalSecondaryIndexProperty
-> Maybe ContributorInsightsSpecificationProperty
indexName :: GlobalSecondaryIndexProperty -> Value Text
keySchema :: GlobalSecondaryIndexProperty -> [KeySchemaProperty]
onDemandThroughput :: GlobalSecondaryIndexProperty -> Maybe OnDemandThroughputProperty
projection :: GlobalSecondaryIndexProperty -> ProjectionProperty
provisionedThroughput :: GlobalSecondaryIndexProperty -> Maybe ProvisionedThroughputProperty
warmThroughput :: GlobalSecondaryIndexProperty -> Maybe WarmThroughputProperty
haddock_workaround_ :: ()
contributorInsightsSpecification :: Maybe ContributorInsightsSpecificationProperty
indexName :: Value Text
keySchema :: [KeySchemaProperty]
onDemandThroughput :: Maybe OnDemandThroughputProperty
projection :: ProjectionProperty
provisionedThroughput :: Maybe ProvisionedThroughputProperty
warmThroughput :: Maybe WarmThroughputProperty
..}
= 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 ContributorInsightsSpecificationProperty
Maybe OnDemandThroughputProperty
Maybe ProvisionedThroughputProperty
()
Value Text
ProjectionProperty
haddock_workaround_ :: ()
contributorInsightsSpecification :: Maybe ContributorInsightsSpecificationProperty
indexName :: Value Text
keySchema :: [KeySchemaProperty]
onDemandThroughput :: Maybe OnDemandThroughputProperty
projection :: ProjectionProperty
provisionedThroughput :: Maybe ProvisionedThroughputProperty
haddock_workaround_ :: ()
contributorInsightsSpecification :: Maybe ContributorInsightsSpecificationProperty
indexName :: Value Text
keySchema :: [KeySchemaProperty]
onDemandThroughput :: Maybe OnDemandThroughputProperty
projection :: ProjectionProperty
provisionedThroughput :: Maybe ProvisionedThroughputProperty
..}