module Stratosphere.IoTEvents.DetectorModel.DynamoDBProperty (
        module Exports, DynamoDBProperty(..), mkDynamoDBProperty
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.IoTEvents.DetectorModel.PayloadProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Value
data DynamoDBProperty
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-iotevents-detectormodel-dynamodb.html>
    DynamoDBProperty {DynamoDBProperty -> ()
haddock_workaround_ :: (),
                      -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-iotevents-detectormodel-dynamodb.html#cfn-iotevents-detectormodel-dynamodb-hashkeyfield>
                      DynamoDBProperty -> Value Text
hashKeyField :: (Value Prelude.Text),
                      -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-iotevents-detectormodel-dynamodb.html#cfn-iotevents-detectormodel-dynamodb-hashkeytype>
                      DynamoDBProperty -> Maybe (Value Text)
hashKeyType :: (Prelude.Maybe (Value Prelude.Text)),
                      -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-iotevents-detectormodel-dynamodb.html#cfn-iotevents-detectormodel-dynamodb-hashkeyvalue>
                      DynamoDBProperty -> Value Text
hashKeyValue :: (Value Prelude.Text),
                      -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-iotevents-detectormodel-dynamodb.html#cfn-iotevents-detectormodel-dynamodb-operation>
                      DynamoDBProperty -> Maybe (Value Text)
operation :: (Prelude.Maybe (Value Prelude.Text)),
                      -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-iotevents-detectormodel-dynamodb.html#cfn-iotevents-detectormodel-dynamodb-payload>
                      DynamoDBProperty -> Maybe PayloadProperty
payload :: (Prelude.Maybe PayloadProperty),
                      -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-iotevents-detectormodel-dynamodb.html#cfn-iotevents-detectormodel-dynamodb-payloadfield>
                      DynamoDBProperty -> Maybe (Value Text)
payloadField :: (Prelude.Maybe (Value Prelude.Text)),
                      -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-iotevents-detectormodel-dynamodb.html#cfn-iotevents-detectormodel-dynamodb-rangekeyfield>
                      DynamoDBProperty -> Maybe (Value Text)
rangeKeyField :: (Prelude.Maybe (Value Prelude.Text)),
                      -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-iotevents-detectormodel-dynamodb.html#cfn-iotevents-detectormodel-dynamodb-rangekeytype>
                      DynamoDBProperty -> Maybe (Value Text)
rangeKeyType :: (Prelude.Maybe (Value Prelude.Text)),
                      -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-iotevents-detectormodel-dynamodb.html#cfn-iotevents-detectormodel-dynamodb-rangekeyvalue>
                      DynamoDBProperty -> Maybe (Value Text)
rangeKeyValue :: (Prelude.Maybe (Value Prelude.Text)),
                      -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-iotevents-detectormodel-dynamodb.html#cfn-iotevents-detectormodel-dynamodb-tablename>
                      DynamoDBProperty -> Value Text
tableName :: (Value Prelude.Text)}
  deriving stock (DynamoDBProperty -> DynamoDBProperty -> Bool
(DynamoDBProperty -> DynamoDBProperty -> Bool)
-> (DynamoDBProperty -> DynamoDBProperty -> Bool)
-> Eq DynamoDBProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: DynamoDBProperty -> DynamoDBProperty -> Bool
== :: DynamoDBProperty -> DynamoDBProperty -> Bool
$c/= :: DynamoDBProperty -> DynamoDBProperty -> Bool
/= :: DynamoDBProperty -> DynamoDBProperty -> Bool
Prelude.Eq, Int -> DynamoDBProperty -> ShowS
[DynamoDBProperty] -> ShowS
DynamoDBProperty -> String
(Int -> DynamoDBProperty -> ShowS)
-> (DynamoDBProperty -> String)
-> ([DynamoDBProperty] -> ShowS)
-> Show DynamoDBProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> DynamoDBProperty -> ShowS
showsPrec :: Int -> DynamoDBProperty -> ShowS
$cshow :: DynamoDBProperty -> String
show :: DynamoDBProperty -> String
$cshowList :: [DynamoDBProperty] -> ShowS
showList :: [DynamoDBProperty] -> ShowS
Prelude.Show)
mkDynamoDBProperty ::
  Value Prelude.Text
  -> Value Prelude.Text -> Value Prelude.Text -> DynamoDBProperty
mkDynamoDBProperty :: Value Text -> Value Text -> Value Text -> DynamoDBProperty
mkDynamoDBProperty Value Text
hashKeyField Value Text
hashKeyValue Value Text
tableName
  = DynamoDBProperty
      {haddock_workaround_ :: ()
haddock_workaround_ = (), hashKeyField :: Value Text
hashKeyField = Value Text
hashKeyField,
       hashKeyValue :: Value Text
hashKeyValue = Value Text
hashKeyValue, tableName :: Value Text
tableName = Value Text
tableName,
       hashKeyType :: Maybe (Value Text)
hashKeyType = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, operation :: Maybe (Value Text)
operation = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       payload :: Maybe PayloadProperty
payload = Maybe PayloadProperty
forall a. Maybe a
Prelude.Nothing, payloadField :: Maybe (Value Text)
payloadField = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       rangeKeyField :: Maybe (Value Text)
rangeKeyField = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, rangeKeyType :: Maybe (Value Text)
rangeKeyType = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       rangeKeyValue :: Maybe (Value Text)
rangeKeyValue = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties DynamoDBProperty where
  toResourceProperties :: DynamoDBProperty -> ResourceProperties
toResourceProperties DynamoDBProperty {Maybe (Value Text)
Maybe PayloadProperty
()
Value Text
haddock_workaround_ :: DynamoDBProperty -> ()
hashKeyField :: DynamoDBProperty -> Value Text
hashKeyType :: DynamoDBProperty -> Maybe (Value Text)
hashKeyValue :: DynamoDBProperty -> Value Text
operation :: DynamoDBProperty -> Maybe (Value Text)
payload :: DynamoDBProperty -> Maybe PayloadProperty
payloadField :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyField :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyType :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyValue :: DynamoDBProperty -> Maybe (Value Text)
tableName :: DynamoDBProperty -> Value Text
haddock_workaround_ :: ()
hashKeyField :: Value Text
hashKeyType :: Maybe (Value Text)
hashKeyValue :: Value Text
operation :: Maybe (Value Text)
payload :: Maybe PayloadProperty
payloadField :: Maybe (Value Text)
rangeKeyField :: Maybe (Value Text)
rangeKeyType :: Maybe (Value Text)
rangeKeyValue :: Maybe (Value Text)
tableName :: Value Text
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::IoTEvents::DetectorModel.DynamoDB",
         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
"HashKeyField" 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
hashKeyField,
                            Key
"HashKeyValue" 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
hashKeyValue, Key
"TableName" 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
tableName]
                           ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                              [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
"HashKeyType" (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)
hashKeyType,
                               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
"Operation" (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)
operation,
                               Key -> PayloadProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Payload" (PayloadProperty -> (Key, Value))
-> Maybe PayloadProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe PayloadProperty
payload,
                               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
"PayloadField" (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)
payloadField,
                               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
"RangeKeyField" (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)
rangeKeyField,
                               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
"RangeKeyType" (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)
rangeKeyType,
                               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
"RangeKeyValue" (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)
rangeKeyValue]))}
instance JSON.ToJSON DynamoDBProperty where
  toJSON :: DynamoDBProperty -> Value
toJSON DynamoDBProperty {Maybe (Value Text)
Maybe PayloadProperty
()
Value Text
haddock_workaround_ :: DynamoDBProperty -> ()
hashKeyField :: DynamoDBProperty -> Value Text
hashKeyType :: DynamoDBProperty -> Maybe (Value Text)
hashKeyValue :: DynamoDBProperty -> Value Text
operation :: DynamoDBProperty -> Maybe (Value Text)
payload :: DynamoDBProperty -> Maybe PayloadProperty
payloadField :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyField :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyType :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyValue :: DynamoDBProperty -> Maybe (Value Text)
tableName :: DynamoDBProperty -> Value Text
haddock_workaround_ :: ()
hashKeyField :: Value Text
hashKeyType :: Maybe (Value Text)
hashKeyValue :: Value Text
operation :: Maybe (Value Text)
payload :: Maybe PayloadProperty
payloadField :: Maybe (Value Text)
rangeKeyField :: Maybe (Value Text)
rangeKeyType :: Maybe (Value Text)
rangeKeyValue :: Maybe (Value Text)
tableName :: Value Text
..}
    = [(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
"HashKeyField" 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
hashKeyField,
               Key
"HashKeyValue" 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
hashKeyValue, Key
"TableName" 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
tableName]
              ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                 [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
"HashKeyType" (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)
hashKeyType,
                  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
"Operation" (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)
operation,
                  Key -> PayloadProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Payload" (PayloadProperty -> (Key, Value))
-> Maybe PayloadProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe PayloadProperty
payload,
                  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
"PayloadField" (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)
payloadField,
                  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
"RangeKeyField" (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)
rangeKeyField,
                  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
"RangeKeyType" (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)
rangeKeyType,
                  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
"RangeKeyValue" (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)
rangeKeyValue])))
instance Property "HashKeyField" DynamoDBProperty where
  type PropertyType "HashKeyField" DynamoDBProperty = Value Prelude.Text
  set :: PropertyType "HashKeyField" DynamoDBProperty
-> DynamoDBProperty -> DynamoDBProperty
set PropertyType "HashKeyField" DynamoDBProperty
newValue DynamoDBProperty {Maybe (Value Text)
Maybe PayloadProperty
()
Value Text
haddock_workaround_ :: DynamoDBProperty -> ()
hashKeyField :: DynamoDBProperty -> Value Text
hashKeyType :: DynamoDBProperty -> Maybe (Value Text)
hashKeyValue :: DynamoDBProperty -> Value Text
operation :: DynamoDBProperty -> Maybe (Value Text)
payload :: DynamoDBProperty -> Maybe PayloadProperty
payloadField :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyField :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyType :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyValue :: DynamoDBProperty -> Maybe (Value Text)
tableName :: DynamoDBProperty -> Value Text
haddock_workaround_ :: ()
hashKeyField :: Value Text
hashKeyType :: Maybe (Value Text)
hashKeyValue :: Value Text
operation :: Maybe (Value Text)
payload :: Maybe PayloadProperty
payloadField :: Maybe (Value Text)
rangeKeyField :: Maybe (Value Text)
rangeKeyType :: Maybe (Value Text)
rangeKeyValue :: Maybe (Value Text)
tableName :: Value Text
..}
    = DynamoDBProperty {hashKeyField :: Value Text
hashKeyField = PropertyType "HashKeyField" DynamoDBProperty
Value Text
newValue, Maybe (Value Text)
Maybe PayloadProperty
()
Value Text
haddock_workaround_ :: ()
hashKeyType :: Maybe (Value Text)
hashKeyValue :: Value Text
operation :: Maybe (Value Text)
payload :: Maybe PayloadProperty
payloadField :: Maybe (Value Text)
rangeKeyField :: Maybe (Value Text)
rangeKeyType :: Maybe (Value Text)
rangeKeyValue :: Maybe (Value Text)
tableName :: Value Text
haddock_workaround_ :: ()
hashKeyType :: Maybe (Value Text)
hashKeyValue :: Value Text
operation :: Maybe (Value Text)
payload :: Maybe PayloadProperty
payloadField :: Maybe (Value Text)
rangeKeyField :: Maybe (Value Text)
rangeKeyType :: Maybe (Value Text)
rangeKeyValue :: Maybe (Value Text)
tableName :: Value Text
..}
instance Property "HashKeyType" DynamoDBProperty where
  type PropertyType "HashKeyType" DynamoDBProperty = Value Prelude.Text
  set :: PropertyType "HashKeyType" DynamoDBProperty
-> DynamoDBProperty -> DynamoDBProperty
set PropertyType "HashKeyType" DynamoDBProperty
newValue DynamoDBProperty {Maybe (Value Text)
Maybe PayloadProperty
()
Value Text
haddock_workaround_ :: DynamoDBProperty -> ()
hashKeyField :: DynamoDBProperty -> Value Text
hashKeyType :: DynamoDBProperty -> Maybe (Value Text)
hashKeyValue :: DynamoDBProperty -> Value Text
operation :: DynamoDBProperty -> Maybe (Value Text)
payload :: DynamoDBProperty -> Maybe PayloadProperty
payloadField :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyField :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyType :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyValue :: DynamoDBProperty -> Maybe (Value Text)
tableName :: DynamoDBProperty -> Value Text
haddock_workaround_ :: ()
hashKeyField :: Value Text
hashKeyType :: Maybe (Value Text)
hashKeyValue :: Value Text
operation :: Maybe (Value Text)
payload :: Maybe PayloadProperty
payloadField :: Maybe (Value Text)
rangeKeyField :: Maybe (Value Text)
rangeKeyType :: Maybe (Value Text)
rangeKeyValue :: Maybe (Value Text)
tableName :: Value Text
..}
    = DynamoDBProperty {hashKeyType :: Maybe (Value Text)
hashKeyType = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "HashKeyType" DynamoDBProperty
Value Text
newValue, Maybe (Value Text)
Maybe PayloadProperty
()
Value Text
haddock_workaround_ :: ()
hashKeyField :: Value Text
hashKeyValue :: Value Text
operation :: Maybe (Value Text)
payload :: Maybe PayloadProperty
payloadField :: Maybe (Value Text)
rangeKeyField :: Maybe (Value Text)
rangeKeyType :: Maybe (Value Text)
rangeKeyValue :: Maybe (Value Text)
tableName :: Value Text
haddock_workaround_ :: ()
hashKeyField :: Value Text
hashKeyValue :: Value Text
operation :: Maybe (Value Text)
payload :: Maybe PayloadProperty
payloadField :: Maybe (Value Text)
rangeKeyField :: Maybe (Value Text)
rangeKeyType :: Maybe (Value Text)
rangeKeyValue :: Maybe (Value Text)
tableName :: Value Text
..}
instance Property "HashKeyValue" DynamoDBProperty where
  type PropertyType "HashKeyValue" DynamoDBProperty = Value Prelude.Text
  set :: PropertyType "HashKeyValue" DynamoDBProperty
-> DynamoDBProperty -> DynamoDBProperty
set PropertyType "HashKeyValue" DynamoDBProperty
newValue DynamoDBProperty {Maybe (Value Text)
Maybe PayloadProperty
()
Value Text
haddock_workaround_ :: DynamoDBProperty -> ()
hashKeyField :: DynamoDBProperty -> Value Text
hashKeyType :: DynamoDBProperty -> Maybe (Value Text)
hashKeyValue :: DynamoDBProperty -> Value Text
operation :: DynamoDBProperty -> Maybe (Value Text)
payload :: DynamoDBProperty -> Maybe PayloadProperty
payloadField :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyField :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyType :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyValue :: DynamoDBProperty -> Maybe (Value Text)
tableName :: DynamoDBProperty -> Value Text
haddock_workaround_ :: ()
hashKeyField :: Value Text
hashKeyType :: Maybe (Value Text)
hashKeyValue :: Value Text
operation :: Maybe (Value Text)
payload :: Maybe PayloadProperty
payloadField :: Maybe (Value Text)
rangeKeyField :: Maybe (Value Text)
rangeKeyType :: Maybe (Value Text)
rangeKeyValue :: Maybe (Value Text)
tableName :: Value Text
..}
    = DynamoDBProperty {hashKeyValue :: Value Text
hashKeyValue = PropertyType "HashKeyValue" DynamoDBProperty
Value Text
newValue, Maybe (Value Text)
Maybe PayloadProperty
()
Value Text
haddock_workaround_ :: ()
hashKeyField :: Value Text
hashKeyType :: Maybe (Value Text)
operation :: Maybe (Value Text)
payload :: Maybe PayloadProperty
payloadField :: Maybe (Value Text)
rangeKeyField :: Maybe (Value Text)
rangeKeyType :: Maybe (Value Text)
rangeKeyValue :: Maybe (Value Text)
tableName :: Value Text
haddock_workaround_ :: ()
hashKeyField :: Value Text
hashKeyType :: Maybe (Value Text)
operation :: Maybe (Value Text)
payload :: Maybe PayloadProperty
payloadField :: Maybe (Value Text)
rangeKeyField :: Maybe (Value Text)
rangeKeyType :: Maybe (Value Text)
rangeKeyValue :: Maybe (Value Text)
tableName :: Value Text
..}
instance Property "Operation" DynamoDBProperty where
  type PropertyType "Operation" DynamoDBProperty = Value Prelude.Text
  set :: PropertyType "Operation" DynamoDBProperty
-> DynamoDBProperty -> DynamoDBProperty
set PropertyType "Operation" DynamoDBProperty
newValue DynamoDBProperty {Maybe (Value Text)
Maybe PayloadProperty
()
Value Text
haddock_workaround_ :: DynamoDBProperty -> ()
hashKeyField :: DynamoDBProperty -> Value Text
hashKeyType :: DynamoDBProperty -> Maybe (Value Text)
hashKeyValue :: DynamoDBProperty -> Value Text
operation :: DynamoDBProperty -> Maybe (Value Text)
payload :: DynamoDBProperty -> Maybe PayloadProperty
payloadField :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyField :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyType :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyValue :: DynamoDBProperty -> Maybe (Value Text)
tableName :: DynamoDBProperty -> Value Text
haddock_workaround_ :: ()
hashKeyField :: Value Text
hashKeyType :: Maybe (Value Text)
hashKeyValue :: Value Text
operation :: Maybe (Value Text)
payload :: Maybe PayloadProperty
payloadField :: Maybe (Value Text)
rangeKeyField :: Maybe (Value Text)
rangeKeyType :: Maybe (Value Text)
rangeKeyValue :: Maybe (Value Text)
tableName :: Value Text
..}
    = DynamoDBProperty {operation :: Maybe (Value Text)
operation = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Operation" DynamoDBProperty
Value Text
newValue, Maybe (Value Text)
Maybe PayloadProperty
()
Value Text
haddock_workaround_ :: ()
hashKeyField :: Value Text
hashKeyType :: Maybe (Value Text)
hashKeyValue :: Value Text
payload :: Maybe PayloadProperty
payloadField :: Maybe (Value Text)
rangeKeyField :: Maybe (Value Text)
rangeKeyType :: Maybe (Value Text)
rangeKeyValue :: Maybe (Value Text)
tableName :: Value Text
haddock_workaround_ :: ()
hashKeyField :: Value Text
hashKeyType :: Maybe (Value Text)
hashKeyValue :: Value Text
payload :: Maybe PayloadProperty
payloadField :: Maybe (Value Text)
rangeKeyField :: Maybe (Value Text)
rangeKeyType :: Maybe (Value Text)
rangeKeyValue :: Maybe (Value Text)
tableName :: Value Text
..}
instance Property "Payload" DynamoDBProperty where
  type PropertyType "Payload" DynamoDBProperty = PayloadProperty
  set :: PropertyType "Payload" DynamoDBProperty
-> DynamoDBProperty -> DynamoDBProperty
set PropertyType "Payload" DynamoDBProperty
newValue DynamoDBProperty {Maybe (Value Text)
Maybe PayloadProperty
()
Value Text
haddock_workaround_ :: DynamoDBProperty -> ()
hashKeyField :: DynamoDBProperty -> Value Text
hashKeyType :: DynamoDBProperty -> Maybe (Value Text)
hashKeyValue :: DynamoDBProperty -> Value Text
operation :: DynamoDBProperty -> Maybe (Value Text)
payload :: DynamoDBProperty -> Maybe PayloadProperty
payloadField :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyField :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyType :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyValue :: DynamoDBProperty -> Maybe (Value Text)
tableName :: DynamoDBProperty -> Value Text
haddock_workaround_ :: ()
hashKeyField :: Value Text
hashKeyType :: Maybe (Value Text)
hashKeyValue :: Value Text
operation :: Maybe (Value Text)
payload :: Maybe PayloadProperty
payloadField :: Maybe (Value Text)
rangeKeyField :: Maybe (Value Text)
rangeKeyType :: Maybe (Value Text)
rangeKeyValue :: Maybe (Value Text)
tableName :: Value Text
..}
    = DynamoDBProperty {payload :: Maybe PayloadProperty
payload = PayloadProperty -> Maybe PayloadProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Payload" DynamoDBProperty
PayloadProperty
newValue, Maybe (Value Text)
()
Value Text
haddock_workaround_ :: ()
hashKeyField :: Value Text
hashKeyType :: Maybe (Value Text)
hashKeyValue :: Value Text
operation :: Maybe (Value Text)
payloadField :: Maybe (Value Text)
rangeKeyField :: Maybe (Value Text)
rangeKeyType :: Maybe (Value Text)
rangeKeyValue :: Maybe (Value Text)
tableName :: Value Text
haddock_workaround_ :: ()
hashKeyField :: Value Text
hashKeyType :: Maybe (Value Text)
hashKeyValue :: Value Text
operation :: Maybe (Value Text)
payloadField :: Maybe (Value Text)
rangeKeyField :: Maybe (Value Text)
rangeKeyType :: Maybe (Value Text)
rangeKeyValue :: Maybe (Value Text)
tableName :: Value Text
..}
instance Property "PayloadField" DynamoDBProperty where
  type PropertyType "PayloadField" DynamoDBProperty = Value Prelude.Text
  set :: PropertyType "PayloadField" DynamoDBProperty
-> DynamoDBProperty -> DynamoDBProperty
set PropertyType "PayloadField" DynamoDBProperty
newValue DynamoDBProperty {Maybe (Value Text)
Maybe PayloadProperty
()
Value Text
haddock_workaround_ :: DynamoDBProperty -> ()
hashKeyField :: DynamoDBProperty -> Value Text
hashKeyType :: DynamoDBProperty -> Maybe (Value Text)
hashKeyValue :: DynamoDBProperty -> Value Text
operation :: DynamoDBProperty -> Maybe (Value Text)
payload :: DynamoDBProperty -> Maybe PayloadProperty
payloadField :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyField :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyType :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyValue :: DynamoDBProperty -> Maybe (Value Text)
tableName :: DynamoDBProperty -> Value Text
haddock_workaround_ :: ()
hashKeyField :: Value Text
hashKeyType :: Maybe (Value Text)
hashKeyValue :: Value Text
operation :: Maybe (Value Text)
payload :: Maybe PayloadProperty
payloadField :: Maybe (Value Text)
rangeKeyField :: Maybe (Value Text)
rangeKeyType :: Maybe (Value Text)
rangeKeyValue :: Maybe (Value Text)
tableName :: Value Text
..}
    = DynamoDBProperty {payloadField :: Maybe (Value Text)
payloadField = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "PayloadField" DynamoDBProperty
Value Text
newValue, Maybe (Value Text)
Maybe PayloadProperty
()
Value Text
haddock_workaround_ :: ()
hashKeyField :: Value Text
hashKeyType :: Maybe (Value Text)
hashKeyValue :: Value Text
operation :: Maybe (Value Text)
payload :: Maybe PayloadProperty
rangeKeyField :: Maybe (Value Text)
rangeKeyType :: Maybe (Value Text)
rangeKeyValue :: Maybe (Value Text)
tableName :: Value Text
haddock_workaround_ :: ()
hashKeyField :: Value Text
hashKeyType :: Maybe (Value Text)
hashKeyValue :: Value Text
operation :: Maybe (Value Text)
payload :: Maybe PayloadProperty
rangeKeyField :: Maybe (Value Text)
rangeKeyType :: Maybe (Value Text)
rangeKeyValue :: Maybe (Value Text)
tableName :: Value Text
..}
instance Property "RangeKeyField" DynamoDBProperty where
  type PropertyType "RangeKeyField" DynamoDBProperty = Value Prelude.Text
  set :: PropertyType "RangeKeyField" DynamoDBProperty
-> DynamoDBProperty -> DynamoDBProperty
set PropertyType "RangeKeyField" DynamoDBProperty
newValue DynamoDBProperty {Maybe (Value Text)
Maybe PayloadProperty
()
Value Text
haddock_workaround_ :: DynamoDBProperty -> ()
hashKeyField :: DynamoDBProperty -> Value Text
hashKeyType :: DynamoDBProperty -> Maybe (Value Text)
hashKeyValue :: DynamoDBProperty -> Value Text
operation :: DynamoDBProperty -> Maybe (Value Text)
payload :: DynamoDBProperty -> Maybe PayloadProperty
payloadField :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyField :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyType :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyValue :: DynamoDBProperty -> Maybe (Value Text)
tableName :: DynamoDBProperty -> Value Text
haddock_workaround_ :: ()
hashKeyField :: Value Text
hashKeyType :: Maybe (Value Text)
hashKeyValue :: Value Text
operation :: Maybe (Value Text)
payload :: Maybe PayloadProperty
payloadField :: Maybe (Value Text)
rangeKeyField :: Maybe (Value Text)
rangeKeyType :: Maybe (Value Text)
rangeKeyValue :: Maybe (Value Text)
tableName :: Value Text
..}
    = DynamoDBProperty {rangeKeyField :: Maybe (Value Text)
rangeKeyField = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "RangeKeyField" DynamoDBProperty
Value Text
newValue, Maybe (Value Text)
Maybe PayloadProperty
()
Value Text
haddock_workaround_ :: ()
hashKeyField :: Value Text
hashKeyType :: Maybe (Value Text)
hashKeyValue :: Value Text
operation :: Maybe (Value Text)
payload :: Maybe PayloadProperty
payloadField :: Maybe (Value Text)
rangeKeyType :: Maybe (Value Text)
rangeKeyValue :: Maybe (Value Text)
tableName :: Value Text
haddock_workaround_ :: ()
hashKeyField :: Value Text
hashKeyType :: Maybe (Value Text)
hashKeyValue :: Value Text
operation :: Maybe (Value Text)
payload :: Maybe PayloadProperty
payloadField :: Maybe (Value Text)
rangeKeyType :: Maybe (Value Text)
rangeKeyValue :: Maybe (Value Text)
tableName :: Value Text
..}
instance Property "RangeKeyType" DynamoDBProperty where
  type PropertyType "RangeKeyType" DynamoDBProperty = Value Prelude.Text
  set :: PropertyType "RangeKeyType" DynamoDBProperty
-> DynamoDBProperty -> DynamoDBProperty
set PropertyType "RangeKeyType" DynamoDBProperty
newValue DynamoDBProperty {Maybe (Value Text)
Maybe PayloadProperty
()
Value Text
haddock_workaround_ :: DynamoDBProperty -> ()
hashKeyField :: DynamoDBProperty -> Value Text
hashKeyType :: DynamoDBProperty -> Maybe (Value Text)
hashKeyValue :: DynamoDBProperty -> Value Text
operation :: DynamoDBProperty -> Maybe (Value Text)
payload :: DynamoDBProperty -> Maybe PayloadProperty
payloadField :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyField :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyType :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyValue :: DynamoDBProperty -> Maybe (Value Text)
tableName :: DynamoDBProperty -> Value Text
haddock_workaround_ :: ()
hashKeyField :: Value Text
hashKeyType :: Maybe (Value Text)
hashKeyValue :: Value Text
operation :: Maybe (Value Text)
payload :: Maybe PayloadProperty
payloadField :: Maybe (Value Text)
rangeKeyField :: Maybe (Value Text)
rangeKeyType :: Maybe (Value Text)
rangeKeyValue :: Maybe (Value Text)
tableName :: Value Text
..}
    = DynamoDBProperty {rangeKeyType :: Maybe (Value Text)
rangeKeyType = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "RangeKeyType" DynamoDBProperty
Value Text
newValue, Maybe (Value Text)
Maybe PayloadProperty
()
Value Text
haddock_workaround_ :: ()
hashKeyField :: Value Text
hashKeyType :: Maybe (Value Text)
hashKeyValue :: Value Text
operation :: Maybe (Value Text)
payload :: Maybe PayloadProperty
payloadField :: Maybe (Value Text)
rangeKeyField :: Maybe (Value Text)
rangeKeyValue :: Maybe (Value Text)
tableName :: Value Text
haddock_workaround_ :: ()
hashKeyField :: Value Text
hashKeyType :: Maybe (Value Text)
hashKeyValue :: Value Text
operation :: Maybe (Value Text)
payload :: Maybe PayloadProperty
payloadField :: Maybe (Value Text)
rangeKeyField :: Maybe (Value Text)
rangeKeyValue :: Maybe (Value Text)
tableName :: Value Text
..}
instance Property "RangeKeyValue" DynamoDBProperty where
  type PropertyType "RangeKeyValue" DynamoDBProperty = Value Prelude.Text
  set :: PropertyType "RangeKeyValue" DynamoDBProperty
-> DynamoDBProperty -> DynamoDBProperty
set PropertyType "RangeKeyValue" DynamoDBProperty
newValue DynamoDBProperty {Maybe (Value Text)
Maybe PayloadProperty
()
Value Text
haddock_workaround_ :: DynamoDBProperty -> ()
hashKeyField :: DynamoDBProperty -> Value Text
hashKeyType :: DynamoDBProperty -> Maybe (Value Text)
hashKeyValue :: DynamoDBProperty -> Value Text
operation :: DynamoDBProperty -> Maybe (Value Text)
payload :: DynamoDBProperty -> Maybe PayloadProperty
payloadField :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyField :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyType :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyValue :: DynamoDBProperty -> Maybe (Value Text)
tableName :: DynamoDBProperty -> Value Text
haddock_workaround_ :: ()
hashKeyField :: Value Text
hashKeyType :: Maybe (Value Text)
hashKeyValue :: Value Text
operation :: Maybe (Value Text)
payload :: Maybe PayloadProperty
payloadField :: Maybe (Value Text)
rangeKeyField :: Maybe (Value Text)
rangeKeyType :: Maybe (Value Text)
rangeKeyValue :: Maybe (Value Text)
tableName :: Value Text
..}
    = DynamoDBProperty {rangeKeyValue :: Maybe (Value Text)
rangeKeyValue = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "RangeKeyValue" DynamoDBProperty
Value Text
newValue, Maybe (Value Text)
Maybe PayloadProperty
()
Value Text
haddock_workaround_ :: ()
hashKeyField :: Value Text
hashKeyType :: Maybe (Value Text)
hashKeyValue :: Value Text
operation :: Maybe (Value Text)
payload :: Maybe PayloadProperty
payloadField :: Maybe (Value Text)
rangeKeyField :: Maybe (Value Text)
rangeKeyType :: Maybe (Value Text)
tableName :: Value Text
haddock_workaround_ :: ()
hashKeyField :: Value Text
hashKeyType :: Maybe (Value Text)
hashKeyValue :: Value Text
operation :: Maybe (Value Text)
payload :: Maybe PayloadProperty
payloadField :: Maybe (Value Text)
rangeKeyField :: Maybe (Value Text)
rangeKeyType :: Maybe (Value Text)
tableName :: Value Text
..}
instance Property "TableName" DynamoDBProperty where
  type PropertyType "TableName" DynamoDBProperty = Value Prelude.Text
  set :: PropertyType "TableName" DynamoDBProperty
-> DynamoDBProperty -> DynamoDBProperty
set PropertyType "TableName" DynamoDBProperty
newValue DynamoDBProperty {Maybe (Value Text)
Maybe PayloadProperty
()
Value Text
haddock_workaround_ :: DynamoDBProperty -> ()
hashKeyField :: DynamoDBProperty -> Value Text
hashKeyType :: DynamoDBProperty -> Maybe (Value Text)
hashKeyValue :: DynamoDBProperty -> Value Text
operation :: DynamoDBProperty -> Maybe (Value Text)
payload :: DynamoDBProperty -> Maybe PayloadProperty
payloadField :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyField :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyType :: DynamoDBProperty -> Maybe (Value Text)
rangeKeyValue :: DynamoDBProperty -> Maybe (Value Text)
tableName :: DynamoDBProperty -> Value Text
haddock_workaround_ :: ()
hashKeyField :: Value Text
hashKeyType :: Maybe (Value Text)
hashKeyValue :: Value Text
operation :: Maybe (Value Text)
payload :: Maybe PayloadProperty
payloadField :: Maybe (Value Text)
rangeKeyField :: Maybe (Value Text)
rangeKeyType :: Maybe (Value Text)
rangeKeyValue :: Maybe (Value Text)
tableName :: Value Text
..}
    = DynamoDBProperty {tableName :: Value Text
tableName = PropertyType "TableName" DynamoDBProperty
Value Text
newValue, Maybe (Value Text)
Maybe PayloadProperty
()
Value Text
haddock_workaround_ :: ()
hashKeyField :: Value Text
hashKeyType :: Maybe (Value Text)
hashKeyValue :: Value Text
operation :: Maybe (Value Text)
payload :: Maybe PayloadProperty
payloadField :: Maybe (Value Text)
rangeKeyField :: Maybe (Value Text)
rangeKeyType :: Maybe (Value Text)
rangeKeyValue :: Maybe (Value Text)
haddock_workaround_ :: ()
hashKeyField :: Value Text
hashKeyType :: Maybe (Value Text)
hashKeyValue :: Value Text
operation :: Maybe (Value Text)
payload :: Maybe PayloadProperty
payloadField :: Maybe (Value Text)
rangeKeyField :: Maybe (Value Text)
rangeKeyType :: Maybe (Value Text)
rangeKeyValue :: Maybe (Value Text)
..}