module Stratosphere.S3Tables.Table (
module Exports, Table(..), mkTable
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.S3Tables.Table.CompactionProperty as Exports
import {-# SOURCE #-} Stratosphere.S3Tables.Table.IcebergMetadataProperty as Exports
import {-# SOURCE #-} Stratosphere.S3Tables.Table.SnapshotManagementProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Value
data Table
=
Table {Table -> ()
haddock_workaround_ :: (),
Table -> Maybe CompactionProperty
compaction :: (Prelude.Maybe CompactionProperty),
Table -> Maybe IcebergMetadataProperty
icebergMetadata :: (Prelude.Maybe IcebergMetadataProperty),
Table -> Value Text
namespace :: (Value Prelude.Text),
Table -> Value Text
openTableFormat :: (Value Prelude.Text),
Table -> Maybe SnapshotManagementProperty
snapshotManagement :: (Prelude.Maybe SnapshotManagementProperty),
Table -> Value Text
tableBucketARN :: (Value Prelude.Text),
Table -> Value Text
tableName :: (Value Prelude.Text),
Table -> Maybe (Value Text)
withoutMetadata :: (Prelude.Maybe (Value Prelude.Text))}
deriving stock (Table -> Table -> Bool
(Table -> Table -> Bool) -> (Table -> Table -> Bool) -> Eq Table
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: Table -> Table -> Bool
== :: Table -> Table -> Bool
$c/= :: Table -> Table -> Bool
/= :: Table -> Table -> Bool
Prelude.Eq, Int -> Table -> ShowS
[Table] -> ShowS
Table -> String
(Int -> Table -> ShowS)
-> (Table -> String) -> ([Table] -> ShowS) -> Show Table
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> Table -> ShowS
showsPrec :: Int -> Table -> ShowS
$cshow :: Table -> String
show :: Table -> String
$cshowList :: [Table] -> ShowS
showList :: [Table] -> ShowS
Prelude.Show)
mkTable ::
Value Prelude.Text
-> Value Prelude.Text
-> Value Prelude.Text -> Value Prelude.Text -> Table
mkTable :: Value Text -> Value Text -> Value Text -> Value Text -> Table
mkTable Value Text
namespace Value Text
openTableFormat Value Text
tableBucketARN Value Text
tableName
= Table
{haddock_workaround_ :: ()
haddock_workaround_ = (), namespace :: Value Text
namespace = Value Text
namespace,
openTableFormat :: Value Text
openTableFormat = Value Text
openTableFormat, tableBucketARN :: Value Text
tableBucketARN = Value Text
tableBucketARN,
tableName :: Value Text
tableName = Value Text
tableName, compaction :: Maybe CompactionProperty
compaction = Maybe CompactionProperty
forall a. Maybe a
Prelude.Nothing,
icebergMetadata :: Maybe IcebergMetadataProperty
icebergMetadata = Maybe IcebergMetadataProperty
forall a. Maybe a
Prelude.Nothing,
snapshotManagement :: Maybe SnapshotManagementProperty
snapshotManagement = Maybe SnapshotManagementProperty
forall a. Maybe a
Prelude.Nothing,
withoutMetadata :: Maybe (Value Text)
withoutMetadata = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties Table where
toResourceProperties :: Table -> ResourceProperties
toResourceProperties Table {Maybe (Value Text)
Maybe CompactionProperty
Maybe IcebergMetadataProperty
Maybe SnapshotManagementProperty
()
Value Text
haddock_workaround_ :: Table -> ()
compaction :: Table -> Maybe CompactionProperty
icebergMetadata :: Table -> Maybe IcebergMetadataProperty
namespace :: Table -> Value Text
openTableFormat :: Table -> Value Text
snapshotManagement :: Table -> Maybe SnapshotManagementProperty
tableBucketARN :: Table -> Value Text
tableName :: Table -> Value Text
withoutMetadata :: Table -> Maybe (Value Text)
haddock_workaround_ :: ()
compaction :: Maybe CompactionProperty
icebergMetadata :: Maybe IcebergMetadataProperty
namespace :: Value Text
openTableFormat :: Value Text
snapshotManagement :: Maybe SnapshotManagementProperty
tableBucketARN :: Value Text
tableName :: Value Text
withoutMetadata :: Maybe (Value Text)
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::S3Tables::Table", 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
"Namespace" 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
namespace,
Key
"OpenTableFormat" 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
openTableFormat,
Key
"TableBucketARN" 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
tableBucketARN,
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 -> CompactionProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Compaction" (CompactionProperty -> (Key, Value))
-> Maybe CompactionProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe CompactionProperty
compaction,
Key -> IcebergMetadataProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"IcebergMetadata" (IcebergMetadataProperty -> (Key, Value))
-> Maybe IcebergMetadataProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe IcebergMetadataProperty
icebergMetadata,
Key -> SnapshotManagementProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SnapshotManagement" (SnapshotManagementProperty -> (Key, Value))
-> Maybe SnapshotManagementProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe SnapshotManagementProperty
snapshotManagement,
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
"WithoutMetadata" (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)
withoutMetadata]))}
instance JSON.ToJSON Table where
toJSON :: Table -> Value
toJSON Table {Maybe (Value Text)
Maybe CompactionProperty
Maybe IcebergMetadataProperty
Maybe SnapshotManagementProperty
()
Value Text
haddock_workaround_ :: Table -> ()
compaction :: Table -> Maybe CompactionProperty
icebergMetadata :: Table -> Maybe IcebergMetadataProperty
namespace :: Table -> Value Text
openTableFormat :: Table -> Value Text
snapshotManagement :: Table -> Maybe SnapshotManagementProperty
tableBucketARN :: Table -> Value Text
tableName :: Table -> Value Text
withoutMetadata :: Table -> Maybe (Value Text)
haddock_workaround_ :: ()
compaction :: Maybe CompactionProperty
icebergMetadata :: Maybe IcebergMetadataProperty
namespace :: Value Text
openTableFormat :: Value Text
snapshotManagement :: Maybe SnapshotManagementProperty
tableBucketARN :: Value Text
tableName :: Value Text
withoutMetadata :: Maybe (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
"Namespace" 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
namespace,
Key
"OpenTableFormat" 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
openTableFormat,
Key
"TableBucketARN" 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
tableBucketARN,
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 -> CompactionProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Compaction" (CompactionProperty -> (Key, Value))
-> Maybe CompactionProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe CompactionProperty
compaction,
Key -> IcebergMetadataProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"IcebergMetadata" (IcebergMetadataProperty -> (Key, Value))
-> Maybe IcebergMetadataProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe IcebergMetadataProperty
icebergMetadata,
Key -> SnapshotManagementProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SnapshotManagement" (SnapshotManagementProperty -> (Key, Value))
-> Maybe SnapshotManagementProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe SnapshotManagementProperty
snapshotManagement,
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
"WithoutMetadata" (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)
withoutMetadata])))
instance Property "Compaction" Table where
type PropertyType "Compaction" Table = CompactionProperty
set :: PropertyType "Compaction" Table -> Table -> Table
set PropertyType "Compaction" Table
newValue Table {Maybe (Value Text)
Maybe CompactionProperty
Maybe IcebergMetadataProperty
Maybe SnapshotManagementProperty
()
Value Text
haddock_workaround_ :: Table -> ()
compaction :: Table -> Maybe CompactionProperty
icebergMetadata :: Table -> Maybe IcebergMetadataProperty
namespace :: Table -> Value Text
openTableFormat :: Table -> Value Text
snapshotManagement :: Table -> Maybe SnapshotManagementProperty
tableBucketARN :: Table -> Value Text
tableName :: Table -> Value Text
withoutMetadata :: Table -> Maybe (Value Text)
haddock_workaround_ :: ()
compaction :: Maybe CompactionProperty
icebergMetadata :: Maybe IcebergMetadataProperty
namespace :: Value Text
openTableFormat :: Value Text
snapshotManagement :: Maybe SnapshotManagementProperty
tableBucketARN :: Value Text
tableName :: Value Text
withoutMetadata :: Maybe (Value Text)
..}
= Table {compaction :: Maybe CompactionProperty
compaction = CompactionProperty -> Maybe CompactionProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Compaction" Table
CompactionProperty
newValue, Maybe (Value Text)
Maybe IcebergMetadataProperty
Maybe SnapshotManagementProperty
()
Value Text
haddock_workaround_ :: ()
icebergMetadata :: Maybe IcebergMetadataProperty
namespace :: Value Text
openTableFormat :: Value Text
snapshotManagement :: Maybe SnapshotManagementProperty
tableBucketARN :: Value Text
tableName :: Value Text
withoutMetadata :: Maybe (Value Text)
haddock_workaround_ :: ()
icebergMetadata :: Maybe IcebergMetadataProperty
namespace :: Value Text
openTableFormat :: Value Text
snapshotManagement :: Maybe SnapshotManagementProperty
tableBucketARN :: Value Text
tableName :: Value Text
withoutMetadata :: Maybe (Value Text)
..}
instance Property "IcebergMetadata" Table where
type PropertyType "IcebergMetadata" Table = IcebergMetadataProperty
set :: PropertyType "IcebergMetadata" Table -> Table -> Table
set PropertyType "IcebergMetadata" Table
newValue Table {Maybe (Value Text)
Maybe CompactionProperty
Maybe IcebergMetadataProperty
Maybe SnapshotManagementProperty
()
Value Text
haddock_workaround_ :: Table -> ()
compaction :: Table -> Maybe CompactionProperty
icebergMetadata :: Table -> Maybe IcebergMetadataProperty
namespace :: Table -> Value Text
openTableFormat :: Table -> Value Text
snapshotManagement :: Table -> Maybe SnapshotManagementProperty
tableBucketARN :: Table -> Value Text
tableName :: Table -> Value Text
withoutMetadata :: Table -> Maybe (Value Text)
haddock_workaround_ :: ()
compaction :: Maybe CompactionProperty
icebergMetadata :: Maybe IcebergMetadataProperty
namespace :: Value Text
openTableFormat :: Value Text
snapshotManagement :: Maybe SnapshotManagementProperty
tableBucketARN :: Value Text
tableName :: Value Text
withoutMetadata :: Maybe (Value Text)
..}
= Table {icebergMetadata :: Maybe IcebergMetadataProperty
icebergMetadata = IcebergMetadataProperty -> Maybe IcebergMetadataProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "IcebergMetadata" Table
IcebergMetadataProperty
newValue, Maybe (Value Text)
Maybe CompactionProperty
Maybe SnapshotManagementProperty
()
Value Text
haddock_workaround_ :: ()
compaction :: Maybe CompactionProperty
namespace :: Value Text
openTableFormat :: Value Text
snapshotManagement :: Maybe SnapshotManagementProperty
tableBucketARN :: Value Text
tableName :: Value Text
withoutMetadata :: Maybe (Value Text)
haddock_workaround_ :: ()
compaction :: Maybe CompactionProperty
namespace :: Value Text
openTableFormat :: Value Text
snapshotManagement :: Maybe SnapshotManagementProperty
tableBucketARN :: Value Text
tableName :: Value Text
withoutMetadata :: Maybe (Value Text)
..}
instance Property "Namespace" Table where
type PropertyType "Namespace" Table = Value Prelude.Text
set :: PropertyType "Namespace" Table -> Table -> Table
set PropertyType "Namespace" Table
newValue Table {Maybe (Value Text)
Maybe CompactionProperty
Maybe IcebergMetadataProperty
Maybe SnapshotManagementProperty
()
Value Text
haddock_workaround_ :: Table -> ()
compaction :: Table -> Maybe CompactionProperty
icebergMetadata :: Table -> Maybe IcebergMetadataProperty
namespace :: Table -> Value Text
openTableFormat :: Table -> Value Text
snapshotManagement :: Table -> Maybe SnapshotManagementProperty
tableBucketARN :: Table -> Value Text
tableName :: Table -> Value Text
withoutMetadata :: Table -> Maybe (Value Text)
haddock_workaround_ :: ()
compaction :: Maybe CompactionProperty
icebergMetadata :: Maybe IcebergMetadataProperty
namespace :: Value Text
openTableFormat :: Value Text
snapshotManagement :: Maybe SnapshotManagementProperty
tableBucketARN :: Value Text
tableName :: Value Text
withoutMetadata :: Maybe (Value Text)
..} = Table {namespace :: Value Text
namespace = PropertyType "Namespace" Table
Value Text
newValue, Maybe (Value Text)
Maybe CompactionProperty
Maybe IcebergMetadataProperty
Maybe SnapshotManagementProperty
()
Value Text
haddock_workaround_ :: ()
compaction :: Maybe CompactionProperty
icebergMetadata :: Maybe IcebergMetadataProperty
openTableFormat :: Value Text
snapshotManagement :: Maybe SnapshotManagementProperty
tableBucketARN :: Value Text
tableName :: Value Text
withoutMetadata :: Maybe (Value Text)
haddock_workaround_ :: ()
compaction :: Maybe CompactionProperty
icebergMetadata :: Maybe IcebergMetadataProperty
openTableFormat :: Value Text
snapshotManagement :: Maybe SnapshotManagementProperty
tableBucketARN :: Value Text
tableName :: Value Text
withoutMetadata :: Maybe (Value Text)
..}
instance Property "OpenTableFormat" Table where
type PropertyType "OpenTableFormat" Table = Value Prelude.Text
set :: PropertyType "OpenTableFormat" Table -> Table -> Table
set PropertyType "OpenTableFormat" Table
newValue Table {Maybe (Value Text)
Maybe CompactionProperty
Maybe IcebergMetadataProperty
Maybe SnapshotManagementProperty
()
Value Text
haddock_workaround_ :: Table -> ()
compaction :: Table -> Maybe CompactionProperty
icebergMetadata :: Table -> Maybe IcebergMetadataProperty
namespace :: Table -> Value Text
openTableFormat :: Table -> Value Text
snapshotManagement :: Table -> Maybe SnapshotManagementProperty
tableBucketARN :: Table -> Value Text
tableName :: Table -> Value Text
withoutMetadata :: Table -> Maybe (Value Text)
haddock_workaround_ :: ()
compaction :: Maybe CompactionProperty
icebergMetadata :: Maybe IcebergMetadataProperty
namespace :: Value Text
openTableFormat :: Value Text
snapshotManagement :: Maybe SnapshotManagementProperty
tableBucketARN :: Value Text
tableName :: Value Text
withoutMetadata :: Maybe (Value Text)
..} = Table {openTableFormat :: Value Text
openTableFormat = PropertyType "OpenTableFormat" Table
Value Text
newValue, Maybe (Value Text)
Maybe CompactionProperty
Maybe IcebergMetadataProperty
Maybe SnapshotManagementProperty
()
Value Text
haddock_workaround_ :: ()
compaction :: Maybe CompactionProperty
icebergMetadata :: Maybe IcebergMetadataProperty
namespace :: Value Text
snapshotManagement :: Maybe SnapshotManagementProperty
tableBucketARN :: Value Text
tableName :: Value Text
withoutMetadata :: Maybe (Value Text)
haddock_workaround_ :: ()
compaction :: Maybe CompactionProperty
icebergMetadata :: Maybe IcebergMetadataProperty
namespace :: Value Text
snapshotManagement :: Maybe SnapshotManagementProperty
tableBucketARN :: Value Text
tableName :: Value Text
withoutMetadata :: Maybe (Value Text)
..}
instance Property "SnapshotManagement" Table where
type PropertyType "SnapshotManagement" Table = SnapshotManagementProperty
set :: PropertyType "SnapshotManagement" Table -> Table -> Table
set PropertyType "SnapshotManagement" Table
newValue Table {Maybe (Value Text)
Maybe CompactionProperty
Maybe IcebergMetadataProperty
Maybe SnapshotManagementProperty
()
Value Text
haddock_workaround_ :: Table -> ()
compaction :: Table -> Maybe CompactionProperty
icebergMetadata :: Table -> Maybe IcebergMetadataProperty
namespace :: Table -> Value Text
openTableFormat :: Table -> Value Text
snapshotManagement :: Table -> Maybe SnapshotManagementProperty
tableBucketARN :: Table -> Value Text
tableName :: Table -> Value Text
withoutMetadata :: Table -> Maybe (Value Text)
haddock_workaround_ :: ()
compaction :: Maybe CompactionProperty
icebergMetadata :: Maybe IcebergMetadataProperty
namespace :: Value Text
openTableFormat :: Value Text
snapshotManagement :: Maybe SnapshotManagementProperty
tableBucketARN :: Value Text
tableName :: Value Text
withoutMetadata :: Maybe (Value Text)
..}
= Table {snapshotManagement :: Maybe SnapshotManagementProperty
snapshotManagement = SnapshotManagementProperty -> Maybe SnapshotManagementProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "SnapshotManagement" Table
SnapshotManagementProperty
newValue, Maybe (Value Text)
Maybe CompactionProperty
Maybe IcebergMetadataProperty
()
Value Text
haddock_workaround_ :: ()
compaction :: Maybe CompactionProperty
icebergMetadata :: Maybe IcebergMetadataProperty
namespace :: Value Text
openTableFormat :: Value Text
tableBucketARN :: Value Text
tableName :: Value Text
withoutMetadata :: Maybe (Value Text)
haddock_workaround_ :: ()
compaction :: Maybe CompactionProperty
icebergMetadata :: Maybe IcebergMetadataProperty
namespace :: Value Text
openTableFormat :: Value Text
tableBucketARN :: Value Text
tableName :: Value Text
withoutMetadata :: Maybe (Value Text)
..}
instance Property "TableBucketARN" Table where
type PropertyType "TableBucketARN" Table = Value Prelude.Text
set :: PropertyType "TableBucketARN" Table -> Table -> Table
set PropertyType "TableBucketARN" Table
newValue Table {Maybe (Value Text)
Maybe CompactionProperty
Maybe IcebergMetadataProperty
Maybe SnapshotManagementProperty
()
Value Text
haddock_workaround_ :: Table -> ()
compaction :: Table -> Maybe CompactionProperty
icebergMetadata :: Table -> Maybe IcebergMetadataProperty
namespace :: Table -> Value Text
openTableFormat :: Table -> Value Text
snapshotManagement :: Table -> Maybe SnapshotManagementProperty
tableBucketARN :: Table -> Value Text
tableName :: Table -> Value Text
withoutMetadata :: Table -> Maybe (Value Text)
haddock_workaround_ :: ()
compaction :: Maybe CompactionProperty
icebergMetadata :: Maybe IcebergMetadataProperty
namespace :: Value Text
openTableFormat :: Value Text
snapshotManagement :: Maybe SnapshotManagementProperty
tableBucketARN :: Value Text
tableName :: Value Text
withoutMetadata :: Maybe (Value Text)
..} = Table {tableBucketARN :: Value Text
tableBucketARN = PropertyType "TableBucketARN" Table
Value Text
newValue, Maybe (Value Text)
Maybe CompactionProperty
Maybe IcebergMetadataProperty
Maybe SnapshotManagementProperty
()
Value Text
haddock_workaround_ :: ()
compaction :: Maybe CompactionProperty
icebergMetadata :: Maybe IcebergMetadataProperty
namespace :: Value Text
openTableFormat :: Value Text
snapshotManagement :: Maybe SnapshotManagementProperty
tableName :: Value Text
withoutMetadata :: Maybe (Value Text)
haddock_workaround_ :: ()
compaction :: Maybe CompactionProperty
icebergMetadata :: Maybe IcebergMetadataProperty
namespace :: Value Text
openTableFormat :: Value Text
snapshotManagement :: Maybe SnapshotManagementProperty
tableName :: Value Text
withoutMetadata :: Maybe (Value Text)
..}
instance Property "TableName" Table where
type PropertyType "TableName" Table = Value Prelude.Text
set :: PropertyType "TableName" Table -> Table -> Table
set PropertyType "TableName" Table
newValue Table {Maybe (Value Text)
Maybe CompactionProperty
Maybe IcebergMetadataProperty
Maybe SnapshotManagementProperty
()
Value Text
haddock_workaround_ :: Table -> ()
compaction :: Table -> Maybe CompactionProperty
icebergMetadata :: Table -> Maybe IcebergMetadataProperty
namespace :: Table -> Value Text
openTableFormat :: Table -> Value Text
snapshotManagement :: Table -> Maybe SnapshotManagementProperty
tableBucketARN :: Table -> Value Text
tableName :: Table -> Value Text
withoutMetadata :: Table -> Maybe (Value Text)
haddock_workaround_ :: ()
compaction :: Maybe CompactionProperty
icebergMetadata :: Maybe IcebergMetadataProperty
namespace :: Value Text
openTableFormat :: Value Text
snapshotManagement :: Maybe SnapshotManagementProperty
tableBucketARN :: Value Text
tableName :: Value Text
withoutMetadata :: Maybe (Value Text)
..} = Table {tableName :: Value Text
tableName = PropertyType "TableName" Table
Value Text
newValue, Maybe (Value Text)
Maybe CompactionProperty
Maybe IcebergMetadataProperty
Maybe SnapshotManagementProperty
()
Value Text
haddock_workaround_ :: ()
compaction :: Maybe CompactionProperty
icebergMetadata :: Maybe IcebergMetadataProperty
namespace :: Value Text
openTableFormat :: Value Text
snapshotManagement :: Maybe SnapshotManagementProperty
tableBucketARN :: Value Text
withoutMetadata :: Maybe (Value Text)
haddock_workaround_ :: ()
compaction :: Maybe CompactionProperty
icebergMetadata :: Maybe IcebergMetadataProperty
namespace :: Value Text
openTableFormat :: Value Text
snapshotManagement :: Maybe SnapshotManagementProperty
tableBucketARN :: Value Text
withoutMetadata :: Maybe (Value Text)
..}
instance Property "WithoutMetadata" Table where
type PropertyType "WithoutMetadata" Table = Value Prelude.Text
set :: PropertyType "WithoutMetadata" Table -> Table -> Table
set PropertyType "WithoutMetadata" Table
newValue Table {Maybe (Value Text)
Maybe CompactionProperty
Maybe IcebergMetadataProperty
Maybe SnapshotManagementProperty
()
Value Text
haddock_workaround_ :: Table -> ()
compaction :: Table -> Maybe CompactionProperty
icebergMetadata :: Table -> Maybe IcebergMetadataProperty
namespace :: Table -> Value Text
openTableFormat :: Table -> Value Text
snapshotManagement :: Table -> Maybe SnapshotManagementProperty
tableBucketARN :: Table -> Value Text
tableName :: Table -> Value Text
withoutMetadata :: Table -> Maybe (Value Text)
haddock_workaround_ :: ()
compaction :: Maybe CompactionProperty
icebergMetadata :: Maybe IcebergMetadataProperty
namespace :: Value Text
openTableFormat :: Value Text
snapshotManagement :: Maybe SnapshotManagementProperty
tableBucketARN :: Value Text
tableName :: Value Text
withoutMetadata :: Maybe (Value Text)
..}
= Table {withoutMetadata :: Maybe (Value Text)
withoutMetadata = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "WithoutMetadata" Table
Value Text
newValue, Maybe CompactionProperty
Maybe IcebergMetadataProperty
Maybe SnapshotManagementProperty
()
Value Text
haddock_workaround_ :: ()
compaction :: Maybe CompactionProperty
icebergMetadata :: Maybe IcebergMetadataProperty
namespace :: Value Text
openTableFormat :: Value Text
snapshotManagement :: Maybe SnapshotManagementProperty
tableBucketARN :: Value Text
tableName :: Value Text
haddock_workaround_ :: ()
compaction :: Maybe CompactionProperty
icebergMetadata :: Maybe IcebergMetadataProperty
namespace :: Value Text
openTableFormat :: Value Text
snapshotManagement :: Maybe SnapshotManagementProperty
tableBucketARN :: Value Text
tableName :: Value Text
..}