module Stratosphere.DMS.Endpoint.KinesisSettingsProperty (
        KinesisSettingsProperty(..), mkKinesisSettingsProperty
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data KinesisSettingsProperty
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-dms-endpoint-kinesissettings.html>
    KinesisSettingsProperty {KinesisSettingsProperty -> ()
haddock_workaround_ :: (),
                             -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-dms-endpoint-kinesissettings.html#cfn-dms-endpoint-kinesissettings-includecontroldetails>
                             KinesisSettingsProperty -> Maybe (Value Bool)
includeControlDetails :: (Prelude.Maybe (Value Prelude.Bool)),
                             -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-dms-endpoint-kinesissettings.html#cfn-dms-endpoint-kinesissettings-includenullandempty>
                             KinesisSettingsProperty -> Maybe (Value Bool)
includeNullAndEmpty :: (Prelude.Maybe (Value Prelude.Bool)),
                             -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-dms-endpoint-kinesissettings.html#cfn-dms-endpoint-kinesissettings-includepartitionvalue>
                             KinesisSettingsProperty -> Maybe (Value Bool)
includePartitionValue :: (Prelude.Maybe (Value Prelude.Bool)),
                             -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-dms-endpoint-kinesissettings.html#cfn-dms-endpoint-kinesissettings-includetablealteroperations>
                             KinesisSettingsProperty -> Maybe (Value Bool)
includeTableAlterOperations :: (Prelude.Maybe (Value Prelude.Bool)),
                             -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-dms-endpoint-kinesissettings.html#cfn-dms-endpoint-kinesissettings-includetransactiondetails>
                             KinesisSettingsProperty -> Maybe (Value Bool)
includeTransactionDetails :: (Prelude.Maybe (Value Prelude.Bool)),
                             -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-dms-endpoint-kinesissettings.html#cfn-dms-endpoint-kinesissettings-messageformat>
                             KinesisSettingsProperty -> Maybe (Value Text)
messageFormat :: (Prelude.Maybe (Value Prelude.Text)),
                             -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-dms-endpoint-kinesissettings.html#cfn-dms-endpoint-kinesissettings-nohexprefix>
                             KinesisSettingsProperty -> Maybe (Value Bool)
noHexPrefix :: (Prelude.Maybe (Value Prelude.Bool)),
                             -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-dms-endpoint-kinesissettings.html#cfn-dms-endpoint-kinesissettings-partitionincludeschematable>
                             KinesisSettingsProperty -> Maybe (Value Bool)
partitionIncludeSchemaTable :: (Prelude.Maybe (Value Prelude.Bool)),
                             -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-dms-endpoint-kinesissettings.html#cfn-dms-endpoint-kinesissettings-serviceaccessrolearn>
                             KinesisSettingsProperty -> Maybe (Value Text)
serviceAccessRoleArn :: (Prelude.Maybe (Value Prelude.Text)),
                             -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-dms-endpoint-kinesissettings.html#cfn-dms-endpoint-kinesissettings-streamarn>
                             KinesisSettingsProperty -> Maybe (Value Text)
streamArn :: (Prelude.Maybe (Value Prelude.Text))}
  deriving stock (KinesisSettingsProperty -> KinesisSettingsProperty -> Bool
(KinesisSettingsProperty -> KinesisSettingsProperty -> Bool)
-> (KinesisSettingsProperty -> KinesisSettingsProperty -> Bool)
-> Eq KinesisSettingsProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: KinesisSettingsProperty -> KinesisSettingsProperty -> Bool
== :: KinesisSettingsProperty -> KinesisSettingsProperty -> Bool
$c/= :: KinesisSettingsProperty -> KinesisSettingsProperty -> Bool
/= :: KinesisSettingsProperty -> KinesisSettingsProperty -> Bool
Prelude.Eq, Int -> KinesisSettingsProperty -> ShowS
[KinesisSettingsProperty] -> ShowS
KinesisSettingsProperty -> String
(Int -> KinesisSettingsProperty -> ShowS)
-> (KinesisSettingsProperty -> String)
-> ([KinesisSettingsProperty] -> ShowS)
-> Show KinesisSettingsProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> KinesisSettingsProperty -> ShowS
showsPrec :: Int -> KinesisSettingsProperty -> ShowS
$cshow :: KinesisSettingsProperty -> String
show :: KinesisSettingsProperty -> String
$cshowList :: [KinesisSettingsProperty] -> ShowS
showList :: [KinesisSettingsProperty] -> ShowS
Prelude.Show)
mkKinesisSettingsProperty :: KinesisSettingsProperty
mkKinesisSettingsProperty :: KinesisSettingsProperty
mkKinesisSettingsProperty
  = KinesisSettingsProperty
      {haddock_workaround_ :: ()
haddock_workaround_ = (), includeControlDetails :: Maybe (Value Bool)
includeControlDetails = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
       includeNullAndEmpty :: Maybe (Value Bool)
includeNullAndEmpty = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
       includePartitionValue :: Maybe (Value Bool)
includePartitionValue = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
       includeTableAlterOperations :: Maybe (Value Bool)
includeTableAlterOperations = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
       includeTransactionDetails :: Maybe (Value Bool)
includeTransactionDetails = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
       messageFormat :: Maybe (Value Text)
messageFormat = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, noHexPrefix :: Maybe (Value Bool)
noHexPrefix = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
       partitionIncludeSchemaTable :: Maybe (Value Bool)
partitionIncludeSchemaTable = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
       serviceAccessRoleArn :: Maybe (Value Text)
serviceAccessRoleArn = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
       streamArn :: Maybe (Value Text)
streamArn = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties KinesisSettingsProperty where
  toResourceProperties :: KinesisSettingsProperty -> ResourceProperties
toResourceProperties KinesisSettingsProperty {Maybe (Value Bool)
Maybe (Value Text)
()
haddock_workaround_ :: KinesisSettingsProperty -> ()
includeControlDetails :: KinesisSettingsProperty -> Maybe (Value Bool)
includeNullAndEmpty :: KinesisSettingsProperty -> Maybe (Value Bool)
includePartitionValue :: KinesisSettingsProperty -> Maybe (Value Bool)
includeTableAlterOperations :: KinesisSettingsProperty -> Maybe (Value Bool)
includeTransactionDetails :: KinesisSettingsProperty -> Maybe (Value Bool)
messageFormat :: KinesisSettingsProperty -> Maybe (Value Text)
noHexPrefix :: KinesisSettingsProperty -> Maybe (Value Bool)
partitionIncludeSchemaTable :: KinesisSettingsProperty -> Maybe (Value Bool)
serviceAccessRoleArn :: KinesisSettingsProperty -> Maybe (Value Text)
streamArn :: KinesisSettingsProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
includeControlDetails :: Maybe (Value Bool)
includeNullAndEmpty :: Maybe (Value Bool)
includePartitionValue :: Maybe (Value Bool)
includeTableAlterOperations :: Maybe (Value Bool)
includeTransactionDetails :: Maybe (Value Bool)
messageFormat :: Maybe (Value Text)
noHexPrefix :: Maybe (Value Bool)
partitionIncludeSchemaTable :: Maybe (Value Bool)
serviceAccessRoleArn :: Maybe (Value Text)
streamArn :: Maybe (Value Text)
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::DMS::Endpoint.KinesisSettings",
         supportsTags :: Bool
supportsTags = Bool
Prelude.False,
         properties :: Object
properties = [Item Object] -> Object
forall l. IsList l => [Item l] -> l
Prelude.fromList
                        ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
                           [Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"IncludeControlDetails"
                              (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
includeControlDetails,
                            Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"IncludeNullAndEmpty" (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
includeNullAndEmpty,
                            Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"IncludePartitionValue"
                              (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
includePartitionValue,
                            Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"IncludeTableAlterOperations"
                              (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
includeTableAlterOperations,
                            Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"IncludeTransactionDetails"
                              (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
includeTransactionDetails,
                            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
"MessageFormat" (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)
messageFormat,
                            Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"NoHexPrefix" (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
noHexPrefix,
                            Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"PartitionIncludeSchemaTable"
                              (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
partitionIncludeSchemaTable,
                            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
"ServiceAccessRoleArn" (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)
serviceAccessRoleArn,
                            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
"StreamArn" (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)
streamArn])}
instance JSON.ToJSON KinesisSettingsProperty where
  toJSON :: KinesisSettingsProperty -> Value
toJSON KinesisSettingsProperty {Maybe (Value Bool)
Maybe (Value Text)
()
haddock_workaround_ :: KinesisSettingsProperty -> ()
includeControlDetails :: KinesisSettingsProperty -> Maybe (Value Bool)
includeNullAndEmpty :: KinesisSettingsProperty -> Maybe (Value Bool)
includePartitionValue :: KinesisSettingsProperty -> Maybe (Value Bool)
includeTableAlterOperations :: KinesisSettingsProperty -> Maybe (Value Bool)
includeTransactionDetails :: KinesisSettingsProperty -> Maybe (Value Bool)
messageFormat :: KinesisSettingsProperty -> Maybe (Value Text)
noHexPrefix :: KinesisSettingsProperty -> Maybe (Value Bool)
partitionIncludeSchemaTable :: KinesisSettingsProperty -> Maybe (Value Bool)
serviceAccessRoleArn :: KinesisSettingsProperty -> Maybe (Value Text)
streamArn :: KinesisSettingsProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
includeControlDetails :: Maybe (Value Bool)
includeNullAndEmpty :: Maybe (Value Bool)
includePartitionValue :: Maybe (Value Bool)
includeTableAlterOperations :: Maybe (Value Bool)
includeTransactionDetails :: Maybe (Value Bool)
messageFormat :: Maybe (Value Text)
noHexPrefix :: Maybe (Value Bool)
partitionIncludeSchemaTable :: Maybe (Value Bool)
serviceAccessRoleArn :: Maybe (Value Text)
streamArn :: Maybe (Value Text)
..}
    = [(Key, Value)] -> Value
JSON.object
        ([Item [(Key, Value)]] -> [(Key, Value)]
forall l. IsList l => [Item l] -> l
Prelude.fromList
           ([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
              [Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"IncludeControlDetails"
                 (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
includeControlDetails,
               Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"IncludeNullAndEmpty" (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
includeNullAndEmpty,
               Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"IncludePartitionValue"
                 (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
includePartitionValue,
               Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"IncludeTableAlterOperations"
                 (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
includeTableAlterOperations,
               Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"IncludeTransactionDetails"
                 (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
includeTransactionDetails,
               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
"MessageFormat" (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)
messageFormat,
               Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"NoHexPrefix" (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
noHexPrefix,
               Key -> Value Bool -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"PartitionIncludeSchemaTable"
                 (Value Bool -> (Key, Value))
-> Maybe (Value Bool) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Bool)
partitionIncludeSchemaTable,
               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
"ServiceAccessRoleArn" (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)
serviceAccessRoleArn,
               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
"StreamArn" (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)
streamArn]))
instance Property "IncludeControlDetails" KinesisSettingsProperty where
  type PropertyType "IncludeControlDetails" KinesisSettingsProperty = Value Prelude.Bool
  set :: PropertyType "IncludeControlDetails" KinesisSettingsProperty
-> KinesisSettingsProperty -> KinesisSettingsProperty
set PropertyType "IncludeControlDetails" KinesisSettingsProperty
newValue KinesisSettingsProperty {Maybe (Value Bool)
Maybe (Value Text)
()
haddock_workaround_ :: KinesisSettingsProperty -> ()
includeControlDetails :: KinesisSettingsProperty -> Maybe (Value Bool)
includeNullAndEmpty :: KinesisSettingsProperty -> Maybe (Value Bool)
includePartitionValue :: KinesisSettingsProperty -> Maybe (Value Bool)
includeTableAlterOperations :: KinesisSettingsProperty -> Maybe (Value Bool)
includeTransactionDetails :: KinesisSettingsProperty -> Maybe (Value Bool)
messageFormat :: KinesisSettingsProperty -> Maybe (Value Text)
noHexPrefix :: KinesisSettingsProperty -> Maybe (Value Bool)
partitionIncludeSchemaTable :: KinesisSettingsProperty -> Maybe (Value Bool)
serviceAccessRoleArn :: KinesisSettingsProperty -> Maybe (Value Text)
streamArn :: KinesisSettingsProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
includeControlDetails :: Maybe (Value Bool)
includeNullAndEmpty :: Maybe (Value Bool)
includePartitionValue :: Maybe (Value Bool)
includeTableAlterOperations :: Maybe (Value Bool)
includeTransactionDetails :: Maybe (Value Bool)
messageFormat :: Maybe (Value Text)
noHexPrefix :: Maybe (Value Bool)
partitionIncludeSchemaTable :: Maybe (Value Bool)
serviceAccessRoleArn :: Maybe (Value Text)
streamArn :: Maybe (Value Text)
..}
    = KinesisSettingsProperty
        {includeControlDetails :: Maybe (Value Bool)
includeControlDetails = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "IncludeControlDetails" KinesisSettingsProperty
Value Bool
newValue, Maybe (Value Bool)
Maybe (Value Text)
()
haddock_workaround_ :: ()
includeNullAndEmpty :: Maybe (Value Bool)
includePartitionValue :: Maybe (Value Bool)
includeTableAlterOperations :: Maybe (Value Bool)
includeTransactionDetails :: Maybe (Value Bool)
messageFormat :: Maybe (Value Text)
noHexPrefix :: Maybe (Value Bool)
partitionIncludeSchemaTable :: Maybe (Value Bool)
serviceAccessRoleArn :: Maybe (Value Text)
streamArn :: Maybe (Value Text)
haddock_workaround_ :: ()
includeNullAndEmpty :: Maybe (Value Bool)
includePartitionValue :: Maybe (Value Bool)
includeTableAlterOperations :: Maybe (Value Bool)
includeTransactionDetails :: Maybe (Value Bool)
messageFormat :: Maybe (Value Text)
noHexPrefix :: Maybe (Value Bool)
partitionIncludeSchemaTable :: Maybe (Value Bool)
serviceAccessRoleArn :: Maybe (Value Text)
streamArn :: Maybe (Value Text)
..}
instance Property "IncludeNullAndEmpty" KinesisSettingsProperty where
  type PropertyType "IncludeNullAndEmpty" KinesisSettingsProperty = Value Prelude.Bool
  set :: PropertyType "IncludeNullAndEmpty" KinesisSettingsProperty
-> KinesisSettingsProperty -> KinesisSettingsProperty
set PropertyType "IncludeNullAndEmpty" KinesisSettingsProperty
newValue KinesisSettingsProperty {Maybe (Value Bool)
Maybe (Value Text)
()
haddock_workaround_ :: KinesisSettingsProperty -> ()
includeControlDetails :: KinesisSettingsProperty -> Maybe (Value Bool)
includeNullAndEmpty :: KinesisSettingsProperty -> Maybe (Value Bool)
includePartitionValue :: KinesisSettingsProperty -> Maybe (Value Bool)
includeTableAlterOperations :: KinesisSettingsProperty -> Maybe (Value Bool)
includeTransactionDetails :: KinesisSettingsProperty -> Maybe (Value Bool)
messageFormat :: KinesisSettingsProperty -> Maybe (Value Text)
noHexPrefix :: KinesisSettingsProperty -> Maybe (Value Bool)
partitionIncludeSchemaTable :: KinesisSettingsProperty -> Maybe (Value Bool)
serviceAccessRoleArn :: KinesisSettingsProperty -> Maybe (Value Text)
streamArn :: KinesisSettingsProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
includeControlDetails :: Maybe (Value Bool)
includeNullAndEmpty :: Maybe (Value Bool)
includePartitionValue :: Maybe (Value Bool)
includeTableAlterOperations :: Maybe (Value Bool)
includeTransactionDetails :: Maybe (Value Bool)
messageFormat :: Maybe (Value Text)
noHexPrefix :: Maybe (Value Bool)
partitionIncludeSchemaTable :: Maybe (Value Bool)
serviceAccessRoleArn :: Maybe (Value Text)
streamArn :: Maybe (Value Text)
..}
    = KinesisSettingsProperty
        {includeNullAndEmpty :: Maybe (Value Bool)
includeNullAndEmpty = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "IncludeNullAndEmpty" KinesisSettingsProperty
Value Bool
newValue, Maybe (Value Bool)
Maybe (Value Text)
()
haddock_workaround_ :: ()
includeControlDetails :: Maybe (Value Bool)
includePartitionValue :: Maybe (Value Bool)
includeTableAlterOperations :: Maybe (Value Bool)
includeTransactionDetails :: Maybe (Value Bool)
messageFormat :: Maybe (Value Text)
noHexPrefix :: Maybe (Value Bool)
partitionIncludeSchemaTable :: Maybe (Value Bool)
serviceAccessRoleArn :: Maybe (Value Text)
streamArn :: Maybe (Value Text)
haddock_workaround_ :: ()
includeControlDetails :: Maybe (Value Bool)
includePartitionValue :: Maybe (Value Bool)
includeTableAlterOperations :: Maybe (Value Bool)
includeTransactionDetails :: Maybe (Value Bool)
messageFormat :: Maybe (Value Text)
noHexPrefix :: Maybe (Value Bool)
partitionIncludeSchemaTable :: Maybe (Value Bool)
serviceAccessRoleArn :: Maybe (Value Text)
streamArn :: Maybe (Value Text)
..}
instance Property "IncludePartitionValue" KinesisSettingsProperty where
  type PropertyType "IncludePartitionValue" KinesisSettingsProperty = Value Prelude.Bool
  set :: PropertyType "IncludePartitionValue" KinesisSettingsProperty
-> KinesisSettingsProperty -> KinesisSettingsProperty
set PropertyType "IncludePartitionValue" KinesisSettingsProperty
newValue KinesisSettingsProperty {Maybe (Value Bool)
Maybe (Value Text)
()
haddock_workaround_ :: KinesisSettingsProperty -> ()
includeControlDetails :: KinesisSettingsProperty -> Maybe (Value Bool)
includeNullAndEmpty :: KinesisSettingsProperty -> Maybe (Value Bool)
includePartitionValue :: KinesisSettingsProperty -> Maybe (Value Bool)
includeTableAlterOperations :: KinesisSettingsProperty -> Maybe (Value Bool)
includeTransactionDetails :: KinesisSettingsProperty -> Maybe (Value Bool)
messageFormat :: KinesisSettingsProperty -> Maybe (Value Text)
noHexPrefix :: KinesisSettingsProperty -> Maybe (Value Bool)
partitionIncludeSchemaTable :: KinesisSettingsProperty -> Maybe (Value Bool)
serviceAccessRoleArn :: KinesisSettingsProperty -> Maybe (Value Text)
streamArn :: KinesisSettingsProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
includeControlDetails :: Maybe (Value Bool)
includeNullAndEmpty :: Maybe (Value Bool)
includePartitionValue :: Maybe (Value Bool)
includeTableAlterOperations :: Maybe (Value Bool)
includeTransactionDetails :: Maybe (Value Bool)
messageFormat :: Maybe (Value Text)
noHexPrefix :: Maybe (Value Bool)
partitionIncludeSchemaTable :: Maybe (Value Bool)
serviceAccessRoleArn :: Maybe (Value Text)
streamArn :: Maybe (Value Text)
..}
    = KinesisSettingsProperty
        {includePartitionValue :: Maybe (Value Bool)
includePartitionValue = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "IncludePartitionValue" KinesisSettingsProperty
Value Bool
newValue, Maybe (Value Bool)
Maybe (Value Text)
()
haddock_workaround_ :: ()
includeControlDetails :: Maybe (Value Bool)
includeNullAndEmpty :: Maybe (Value Bool)
includeTableAlterOperations :: Maybe (Value Bool)
includeTransactionDetails :: Maybe (Value Bool)
messageFormat :: Maybe (Value Text)
noHexPrefix :: Maybe (Value Bool)
partitionIncludeSchemaTable :: Maybe (Value Bool)
serviceAccessRoleArn :: Maybe (Value Text)
streamArn :: Maybe (Value Text)
haddock_workaround_ :: ()
includeControlDetails :: Maybe (Value Bool)
includeNullAndEmpty :: Maybe (Value Bool)
includeTableAlterOperations :: Maybe (Value Bool)
includeTransactionDetails :: Maybe (Value Bool)
messageFormat :: Maybe (Value Text)
noHexPrefix :: Maybe (Value Bool)
partitionIncludeSchemaTable :: Maybe (Value Bool)
serviceAccessRoleArn :: Maybe (Value Text)
streamArn :: Maybe (Value Text)
..}
instance Property "IncludeTableAlterOperations" KinesisSettingsProperty where
  type PropertyType "IncludeTableAlterOperations" KinesisSettingsProperty = Value Prelude.Bool
  set :: PropertyType "IncludeTableAlterOperations" KinesisSettingsProperty
-> KinesisSettingsProperty -> KinesisSettingsProperty
set PropertyType "IncludeTableAlterOperations" KinesisSettingsProperty
newValue KinesisSettingsProperty {Maybe (Value Bool)
Maybe (Value Text)
()
haddock_workaround_ :: KinesisSettingsProperty -> ()
includeControlDetails :: KinesisSettingsProperty -> Maybe (Value Bool)
includeNullAndEmpty :: KinesisSettingsProperty -> Maybe (Value Bool)
includePartitionValue :: KinesisSettingsProperty -> Maybe (Value Bool)
includeTableAlterOperations :: KinesisSettingsProperty -> Maybe (Value Bool)
includeTransactionDetails :: KinesisSettingsProperty -> Maybe (Value Bool)
messageFormat :: KinesisSettingsProperty -> Maybe (Value Text)
noHexPrefix :: KinesisSettingsProperty -> Maybe (Value Bool)
partitionIncludeSchemaTable :: KinesisSettingsProperty -> Maybe (Value Bool)
serviceAccessRoleArn :: KinesisSettingsProperty -> Maybe (Value Text)
streamArn :: KinesisSettingsProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
includeControlDetails :: Maybe (Value Bool)
includeNullAndEmpty :: Maybe (Value Bool)
includePartitionValue :: Maybe (Value Bool)
includeTableAlterOperations :: Maybe (Value Bool)
includeTransactionDetails :: Maybe (Value Bool)
messageFormat :: Maybe (Value Text)
noHexPrefix :: Maybe (Value Bool)
partitionIncludeSchemaTable :: Maybe (Value Bool)
serviceAccessRoleArn :: Maybe (Value Text)
streamArn :: Maybe (Value Text)
..}
    = KinesisSettingsProperty
        {includeTableAlterOperations :: Maybe (Value Bool)
includeTableAlterOperations = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "IncludeTableAlterOperations" KinesisSettingsProperty
Value Bool
newValue, Maybe (Value Bool)
Maybe (Value Text)
()
haddock_workaround_ :: ()
includeControlDetails :: Maybe (Value Bool)
includeNullAndEmpty :: Maybe (Value Bool)
includePartitionValue :: Maybe (Value Bool)
includeTransactionDetails :: Maybe (Value Bool)
messageFormat :: Maybe (Value Text)
noHexPrefix :: Maybe (Value Bool)
partitionIncludeSchemaTable :: Maybe (Value Bool)
serviceAccessRoleArn :: Maybe (Value Text)
streamArn :: Maybe (Value Text)
haddock_workaround_ :: ()
includeControlDetails :: Maybe (Value Bool)
includeNullAndEmpty :: Maybe (Value Bool)
includePartitionValue :: Maybe (Value Bool)
includeTransactionDetails :: Maybe (Value Bool)
messageFormat :: Maybe (Value Text)
noHexPrefix :: Maybe (Value Bool)
partitionIncludeSchemaTable :: Maybe (Value Bool)
serviceAccessRoleArn :: Maybe (Value Text)
streamArn :: Maybe (Value Text)
..}
instance Property "IncludeTransactionDetails" KinesisSettingsProperty where
  type PropertyType "IncludeTransactionDetails" KinesisSettingsProperty = Value Prelude.Bool
  set :: PropertyType "IncludeTransactionDetails" KinesisSettingsProperty
-> KinesisSettingsProperty -> KinesisSettingsProperty
set PropertyType "IncludeTransactionDetails" KinesisSettingsProperty
newValue KinesisSettingsProperty {Maybe (Value Bool)
Maybe (Value Text)
()
haddock_workaround_ :: KinesisSettingsProperty -> ()
includeControlDetails :: KinesisSettingsProperty -> Maybe (Value Bool)
includeNullAndEmpty :: KinesisSettingsProperty -> Maybe (Value Bool)
includePartitionValue :: KinesisSettingsProperty -> Maybe (Value Bool)
includeTableAlterOperations :: KinesisSettingsProperty -> Maybe (Value Bool)
includeTransactionDetails :: KinesisSettingsProperty -> Maybe (Value Bool)
messageFormat :: KinesisSettingsProperty -> Maybe (Value Text)
noHexPrefix :: KinesisSettingsProperty -> Maybe (Value Bool)
partitionIncludeSchemaTable :: KinesisSettingsProperty -> Maybe (Value Bool)
serviceAccessRoleArn :: KinesisSettingsProperty -> Maybe (Value Text)
streamArn :: KinesisSettingsProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
includeControlDetails :: Maybe (Value Bool)
includeNullAndEmpty :: Maybe (Value Bool)
includePartitionValue :: Maybe (Value Bool)
includeTableAlterOperations :: Maybe (Value Bool)
includeTransactionDetails :: Maybe (Value Bool)
messageFormat :: Maybe (Value Text)
noHexPrefix :: Maybe (Value Bool)
partitionIncludeSchemaTable :: Maybe (Value Bool)
serviceAccessRoleArn :: Maybe (Value Text)
streamArn :: Maybe (Value Text)
..}
    = KinesisSettingsProperty
        {includeTransactionDetails :: Maybe (Value Bool)
includeTransactionDetails = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "IncludeTransactionDetails" KinesisSettingsProperty
Value Bool
newValue, Maybe (Value Bool)
Maybe (Value Text)
()
haddock_workaround_ :: ()
includeControlDetails :: Maybe (Value Bool)
includeNullAndEmpty :: Maybe (Value Bool)
includePartitionValue :: Maybe (Value Bool)
includeTableAlterOperations :: Maybe (Value Bool)
messageFormat :: Maybe (Value Text)
noHexPrefix :: Maybe (Value Bool)
partitionIncludeSchemaTable :: Maybe (Value Bool)
serviceAccessRoleArn :: Maybe (Value Text)
streamArn :: Maybe (Value Text)
haddock_workaround_ :: ()
includeControlDetails :: Maybe (Value Bool)
includeNullAndEmpty :: Maybe (Value Bool)
includePartitionValue :: Maybe (Value Bool)
includeTableAlterOperations :: Maybe (Value Bool)
messageFormat :: Maybe (Value Text)
noHexPrefix :: Maybe (Value Bool)
partitionIncludeSchemaTable :: Maybe (Value Bool)
serviceAccessRoleArn :: Maybe (Value Text)
streamArn :: Maybe (Value Text)
..}
instance Property "MessageFormat" KinesisSettingsProperty where
  type PropertyType "MessageFormat" KinesisSettingsProperty = Value Prelude.Text
  set :: PropertyType "MessageFormat" KinesisSettingsProperty
-> KinesisSettingsProperty -> KinesisSettingsProperty
set PropertyType "MessageFormat" KinesisSettingsProperty
newValue KinesisSettingsProperty {Maybe (Value Bool)
Maybe (Value Text)
()
haddock_workaround_ :: KinesisSettingsProperty -> ()
includeControlDetails :: KinesisSettingsProperty -> Maybe (Value Bool)
includeNullAndEmpty :: KinesisSettingsProperty -> Maybe (Value Bool)
includePartitionValue :: KinesisSettingsProperty -> Maybe (Value Bool)
includeTableAlterOperations :: KinesisSettingsProperty -> Maybe (Value Bool)
includeTransactionDetails :: KinesisSettingsProperty -> Maybe (Value Bool)
messageFormat :: KinesisSettingsProperty -> Maybe (Value Text)
noHexPrefix :: KinesisSettingsProperty -> Maybe (Value Bool)
partitionIncludeSchemaTable :: KinesisSettingsProperty -> Maybe (Value Bool)
serviceAccessRoleArn :: KinesisSettingsProperty -> Maybe (Value Text)
streamArn :: KinesisSettingsProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
includeControlDetails :: Maybe (Value Bool)
includeNullAndEmpty :: Maybe (Value Bool)
includePartitionValue :: Maybe (Value Bool)
includeTableAlterOperations :: Maybe (Value Bool)
includeTransactionDetails :: Maybe (Value Bool)
messageFormat :: Maybe (Value Text)
noHexPrefix :: Maybe (Value Bool)
partitionIncludeSchemaTable :: Maybe (Value Bool)
serviceAccessRoleArn :: Maybe (Value Text)
streamArn :: Maybe (Value Text)
..}
    = KinesisSettingsProperty
        {messageFormat :: Maybe (Value Text)
messageFormat = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "MessageFormat" KinesisSettingsProperty
Value Text
newValue, Maybe (Value Bool)
Maybe (Value Text)
()
haddock_workaround_ :: ()
includeControlDetails :: Maybe (Value Bool)
includeNullAndEmpty :: Maybe (Value Bool)
includePartitionValue :: Maybe (Value Bool)
includeTableAlterOperations :: Maybe (Value Bool)
includeTransactionDetails :: Maybe (Value Bool)
noHexPrefix :: Maybe (Value Bool)
partitionIncludeSchemaTable :: Maybe (Value Bool)
serviceAccessRoleArn :: Maybe (Value Text)
streamArn :: Maybe (Value Text)
haddock_workaround_ :: ()
includeControlDetails :: Maybe (Value Bool)
includeNullAndEmpty :: Maybe (Value Bool)
includePartitionValue :: Maybe (Value Bool)
includeTableAlterOperations :: Maybe (Value Bool)
includeTransactionDetails :: Maybe (Value Bool)
noHexPrefix :: Maybe (Value Bool)
partitionIncludeSchemaTable :: Maybe (Value Bool)
serviceAccessRoleArn :: Maybe (Value Text)
streamArn :: Maybe (Value Text)
..}
instance Property "NoHexPrefix" KinesisSettingsProperty where
  type PropertyType "NoHexPrefix" KinesisSettingsProperty = Value Prelude.Bool
  set :: PropertyType "NoHexPrefix" KinesisSettingsProperty
-> KinesisSettingsProperty -> KinesisSettingsProperty
set PropertyType "NoHexPrefix" KinesisSettingsProperty
newValue KinesisSettingsProperty {Maybe (Value Bool)
Maybe (Value Text)
()
haddock_workaround_ :: KinesisSettingsProperty -> ()
includeControlDetails :: KinesisSettingsProperty -> Maybe (Value Bool)
includeNullAndEmpty :: KinesisSettingsProperty -> Maybe (Value Bool)
includePartitionValue :: KinesisSettingsProperty -> Maybe (Value Bool)
includeTableAlterOperations :: KinesisSettingsProperty -> Maybe (Value Bool)
includeTransactionDetails :: KinesisSettingsProperty -> Maybe (Value Bool)
messageFormat :: KinesisSettingsProperty -> Maybe (Value Text)
noHexPrefix :: KinesisSettingsProperty -> Maybe (Value Bool)
partitionIncludeSchemaTable :: KinesisSettingsProperty -> Maybe (Value Bool)
serviceAccessRoleArn :: KinesisSettingsProperty -> Maybe (Value Text)
streamArn :: KinesisSettingsProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
includeControlDetails :: Maybe (Value Bool)
includeNullAndEmpty :: Maybe (Value Bool)
includePartitionValue :: Maybe (Value Bool)
includeTableAlterOperations :: Maybe (Value Bool)
includeTransactionDetails :: Maybe (Value Bool)
messageFormat :: Maybe (Value Text)
noHexPrefix :: Maybe (Value Bool)
partitionIncludeSchemaTable :: Maybe (Value Bool)
serviceAccessRoleArn :: Maybe (Value Text)
streamArn :: Maybe (Value Text)
..}
    = KinesisSettingsProperty {noHexPrefix :: Maybe (Value Bool)
noHexPrefix = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "NoHexPrefix" KinesisSettingsProperty
Value Bool
newValue, Maybe (Value Bool)
Maybe (Value Text)
()
haddock_workaround_ :: ()
includeControlDetails :: Maybe (Value Bool)
includeNullAndEmpty :: Maybe (Value Bool)
includePartitionValue :: Maybe (Value Bool)
includeTableAlterOperations :: Maybe (Value Bool)
includeTransactionDetails :: Maybe (Value Bool)
messageFormat :: Maybe (Value Text)
partitionIncludeSchemaTable :: Maybe (Value Bool)
serviceAccessRoleArn :: Maybe (Value Text)
streamArn :: Maybe (Value Text)
haddock_workaround_ :: ()
includeControlDetails :: Maybe (Value Bool)
includeNullAndEmpty :: Maybe (Value Bool)
includePartitionValue :: Maybe (Value Bool)
includeTableAlterOperations :: Maybe (Value Bool)
includeTransactionDetails :: Maybe (Value Bool)
messageFormat :: Maybe (Value Text)
partitionIncludeSchemaTable :: Maybe (Value Bool)
serviceAccessRoleArn :: Maybe (Value Text)
streamArn :: Maybe (Value Text)
..}
instance Property "PartitionIncludeSchemaTable" KinesisSettingsProperty where
  type PropertyType "PartitionIncludeSchemaTable" KinesisSettingsProperty = Value Prelude.Bool
  set :: PropertyType "PartitionIncludeSchemaTable" KinesisSettingsProperty
-> KinesisSettingsProperty -> KinesisSettingsProperty
set PropertyType "PartitionIncludeSchemaTable" KinesisSettingsProperty
newValue KinesisSettingsProperty {Maybe (Value Bool)
Maybe (Value Text)
()
haddock_workaround_ :: KinesisSettingsProperty -> ()
includeControlDetails :: KinesisSettingsProperty -> Maybe (Value Bool)
includeNullAndEmpty :: KinesisSettingsProperty -> Maybe (Value Bool)
includePartitionValue :: KinesisSettingsProperty -> Maybe (Value Bool)
includeTableAlterOperations :: KinesisSettingsProperty -> Maybe (Value Bool)
includeTransactionDetails :: KinesisSettingsProperty -> Maybe (Value Bool)
messageFormat :: KinesisSettingsProperty -> Maybe (Value Text)
noHexPrefix :: KinesisSettingsProperty -> Maybe (Value Bool)
partitionIncludeSchemaTable :: KinesisSettingsProperty -> Maybe (Value Bool)
serviceAccessRoleArn :: KinesisSettingsProperty -> Maybe (Value Text)
streamArn :: KinesisSettingsProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
includeControlDetails :: Maybe (Value Bool)
includeNullAndEmpty :: Maybe (Value Bool)
includePartitionValue :: Maybe (Value Bool)
includeTableAlterOperations :: Maybe (Value Bool)
includeTransactionDetails :: Maybe (Value Bool)
messageFormat :: Maybe (Value Text)
noHexPrefix :: Maybe (Value Bool)
partitionIncludeSchemaTable :: Maybe (Value Bool)
serviceAccessRoleArn :: Maybe (Value Text)
streamArn :: Maybe (Value Text)
..}
    = KinesisSettingsProperty
        {partitionIncludeSchemaTable :: Maybe (Value Bool)
partitionIncludeSchemaTable = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "PartitionIncludeSchemaTable" KinesisSettingsProperty
Value Bool
newValue, Maybe (Value Bool)
Maybe (Value Text)
()
haddock_workaround_ :: ()
includeControlDetails :: Maybe (Value Bool)
includeNullAndEmpty :: Maybe (Value Bool)
includePartitionValue :: Maybe (Value Bool)
includeTableAlterOperations :: Maybe (Value Bool)
includeTransactionDetails :: Maybe (Value Bool)
messageFormat :: Maybe (Value Text)
noHexPrefix :: Maybe (Value Bool)
serviceAccessRoleArn :: Maybe (Value Text)
streamArn :: Maybe (Value Text)
haddock_workaround_ :: ()
includeControlDetails :: Maybe (Value Bool)
includeNullAndEmpty :: Maybe (Value Bool)
includePartitionValue :: Maybe (Value Bool)
includeTableAlterOperations :: Maybe (Value Bool)
includeTransactionDetails :: Maybe (Value Bool)
messageFormat :: Maybe (Value Text)
noHexPrefix :: Maybe (Value Bool)
serviceAccessRoleArn :: Maybe (Value Text)
streamArn :: Maybe (Value Text)
..}
instance Property "ServiceAccessRoleArn" KinesisSettingsProperty where
  type PropertyType "ServiceAccessRoleArn" KinesisSettingsProperty = Value Prelude.Text
  set :: PropertyType "ServiceAccessRoleArn" KinesisSettingsProperty
-> KinesisSettingsProperty -> KinesisSettingsProperty
set PropertyType "ServiceAccessRoleArn" KinesisSettingsProperty
newValue KinesisSettingsProperty {Maybe (Value Bool)
Maybe (Value Text)
()
haddock_workaround_ :: KinesisSettingsProperty -> ()
includeControlDetails :: KinesisSettingsProperty -> Maybe (Value Bool)
includeNullAndEmpty :: KinesisSettingsProperty -> Maybe (Value Bool)
includePartitionValue :: KinesisSettingsProperty -> Maybe (Value Bool)
includeTableAlterOperations :: KinesisSettingsProperty -> Maybe (Value Bool)
includeTransactionDetails :: KinesisSettingsProperty -> Maybe (Value Bool)
messageFormat :: KinesisSettingsProperty -> Maybe (Value Text)
noHexPrefix :: KinesisSettingsProperty -> Maybe (Value Bool)
partitionIncludeSchemaTable :: KinesisSettingsProperty -> Maybe (Value Bool)
serviceAccessRoleArn :: KinesisSettingsProperty -> Maybe (Value Text)
streamArn :: KinesisSettingsProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
includeControlDetails :: Maybe (Value Bool)
includeNullAndEmpty :: Maybe (Value Bool)
includePartitionValue :: Maybe (Value Bool)
includeTableAlterOperations :: Maybe (Value Bool)
includeTransactionDetails :: Maybe (Value Bool)
messageFormat :: Maybe (Value Text)
noHexPrefix :: Maybe (Value Bool)
partitionIncludeSchemaTable :: Maybe (Value Bool)
serviceAccessRoleArn :: Maybe (Value Text)
streamArn :: Maybe (Value Text)
..}
    = KinesisSettingsProperty
        {serviceAccessRoleArn :: Maybe (Value Text)
serviceAccessRoleArn = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ServiceAccessRoleArn" KinesisSettingsProperty
Value Text
newValue, Maybe (Value Bool)
Maybe (Value Text)
()
haddock_workaround_ :: ()
includeControlDetails :: Maybe (Value Bool)
includeNullAndEmpty :: Maybe (Value Bool)
includePartitionValue :: Maybe (Value Bool)
includeTableAlterOperations :: Maybe (Value Bool)
includeTransactionDetails :: Maybe (Value Bool)
messageFormat :: Maybe (Value Text)
noHexPrefix :: Maybe (Value Bool)
partitionIncludeSchemaTable :: Maybe (Value Bool)
streamArn :: Maybe (Value Text)
haddock_workaround_ :: ()
includeControlDetails :: Maybe (Value Bool)
includeNullAndEmpty :: Maybe (Value Bool)
includePartitionValue :: Maybe (Value Bool)
includeTableAlterOperations :: Maybe (Value Bool)
includeTransactionDetails :: Maybe (Value Bool)
messageFormat :: Maybe (Value Text)
noHexPrefix :: Maybe (Value Bool)
partitionIncludeSchemaTable :: Maybe (Value Bool)
streamArn :: Maybe (Value Text)
..}
instance Property "StreamArn" KinesisSettingsProperty where
  type PropertyType "StreamArn" KinesisSettingsProperty = Value Prelude.Text
  set :: PropertyType "StreamArn" KinesisSettingsProperty
-> KinesisSettingsProperty -> KinesisSettingsProperty
set PropertyType "StreamArn" KinesisSettingsProperty
newValue KinesisSettingsProperty {Maybe (Value Bool)
Maybe (Value Text)
()
haddock_workaround_ :: KinesisSettingsProperty -> ()
includeControlDetails :: KinesisSettingsProperty -> Maybe (Value Bool)
includeNullAndEmpty :: KinesisSettingsProperty -> Maybe (Value Bool)
includePartitionValue :: KinesisSettingsProperty -> Maybe (Value Bool)
includeTableAlterOperations :: KinesisSettingsProperty -> Maybe (Value Bool)
includeTransactionDetails :: KinesisSettingsProperty -> Maybe (Value Bool)
messageFormat :: KinesisSettingsProperty -> Maybe (Value Text)
noHexPrefix :: KinesisSettingsProperty -> Maybe (Value Bool)
partitionIncludeSchemaTable :: KinesisSettingsProperty -> Maybe (Value Bool)
serviceAccessRoleArn :: KinesisSettingsProperty -> Maybe (Value Text)
streamArn :: KinesisSettingsProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
includeControlDetails :: Maybe (Value Bool)
includeNullAndEmpty :: Maybe (Value Bool)
includePartitionValue :: Maybe (Value Bool)
includeTableAlterOperations :: Maybe (Value Bool)
includeTransactionDetails :: Maybe (Value Bool)
messageFormat :: Maybe (Value Text)
noHexPrefix :: Maybe (Value Bool)
partitionIncludeSchemaTable :: Maybe (Value Bool)
serviceAccessRoleArn :: Maybe (Value Text)
streamArn :: Maybe (Value Text)
..}
    = KinesisSettingsProperty {streamArn :: Maybe (Value Text)
streamArn = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "StreamArn" KinesisSettingsProperty
Value Text
newValue, Maybe (Value Bool)
Maybe (Value Text)
()
haddock_workaround_ :: ()
includeControlDetails :: Maybe (Value Bool)
includeNullAndEmpty :: Maybe (Value Bool)
includePartitionValue :: Maybe (Value Bool)
includeTableAlterOperations :: Maybe (Value Bool)
includeTransactionDetails :: Maybe (Value Bool)
messageFormat :: Maybe (Value Text)
noHexPrefix :: Maybe (Value Bool)
partitionIncludeSchemaTable :: Maybe (Value Bool)
serviceAccessRoleArn :: Maybe (Value Text)
haddock_workaround_ :: ()
includeControlDetails :: Maybe (Value Bool)
includeNullAndEmpty :: Maybe (Value Bool)
includePartitionValue :: Maybe (Value Bool)
includeTableAlterOperations :: Maybe (Value Bool)
includeTransactionDetails :: Maybe (Value Bool)
messageFormat :: Maybe (Value Text)
noHexPrefix :: Maybe (Value Bool)
partitionIncludeSchemaTable :: Maybe (Value Bool)
serviceAccessRoleArn :: Maybe (Value Text)
..}