module Stratosphere.DataBrew.Job.OutputProperty (
module Exports, OutputProperty(..), mkOutputProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.DataBrew.Job.OutputFormatOptionsProperty as Exports
import {-# SOURCE #-} Stratosphere.DataBrew.Job.S3LocationProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Value
data OutputProperty
=
OutputProperty {OutputProperty -> ()
haddock_workaround_ :: (),
OutputProperty -> Maybe (Value Text)
compressionFormat :: (Prelude.Maybe (Value Prelude.Text)),
OutputProperty -> Maybe (Value Text)
format :: (Prelude.Maybe (Value Prelude.Text)),
OutputProperty -> Maybe OutputFormatOptionsProperty
formatOptions :: (Prelude.Maybe OutputFormatOptionsProperty),
OutputProperty -> S3LocationProperty
location :: S3LocationProperty,
OutputProperty -> Maybe (Value Integer)
maxOutputFiles :: (Prelude.Maybe (Value Prelude.Integer)),
OutputProperty -> Maybe (Value Bool)
overwrite :: (Prelude.Maybe (Value Prelude.Bool)),
OutputProperty -> Maybe (ValueList Text)
partitionColumns :: (Prelude.Maybe (ValueList Prelude.Text))}
deriving stock (OutputProperty -> OutputProperty -> Bool
(OutputProperty -> OutputProperty -> Bool)
-> (OutputProperty -> OutputProperty -> Bool) -> Eq OutputProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: OutputProperty -> OutputProperty -> Bool
== :: OutputProperty -> OutputProperty -> Bool
$c/= :: OutputProperty -> OutputProperty -> Bool
/= :: OutputProperty -> OutputProperty -> Bool
Prelude.Eq, Int -> OutputProperty -> ShowS
[OutputProperty] -> ShowS
OutputProperty -> String
(Int -> OutputProperty -> ShowS)
-> (OutputProperty -> String)
-> ([OutputProperty] -> ShowS)
-> Show OutputProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> OutputProperty -> ShowS
showsPrec :: Int -> OutputProperty -> ShowS
$cshow :: OutputProperty -> String
show :: OutputProperty -> String
$cshowList :: [OutputProperty] -> ShowS
showList :: [OutputProperty] -> ShowS
Prelude.Show)
mkOutputProperty :: S3LocationProperty -> OutputProperty
mkOutputProperty :: S3LocationProperty -> OutputProperty
mkOutputProperty S3LocationProperty
location
= OutputProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), location :: S3LocationProperty
location = S3LocationProperty
location,
compressionFormat :: Maybe (Value Text)
compressionFormat = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, format :: Maybe (Value Text)
format = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
formatOptions :: Maybe OutputFormatOptionsProperty
formatOptions = Maybe OutputFormatOptionsProperty
forall a. Maybe a
Prelude.Nothing, maxOutputFiles :: Maybe (Value Integer)
maxOutputFiles = Maybe (Value Integer)
forall a. Maybe a
Prelude.Nothing,
overwrite :: Maybe (Value Bool)
overwrite = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing, partitionColumns :: Maybe (ValueList Text)
partitionColumns = Maybe (ValueList Text)
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties OutputProperty where
toResourceProperties :: OutputProperty -> ResourceProperties
toResourceProperties OutputProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe OutputFormatOptionsProperty
()
S3LocationProperty
haddock_workaround_ :: OutputProperty -> ()
compressionFormat :: OutputProperty -> Maybe (Value Text)
format :: OutputProperty -> Maybe (Value Text)
formatOptions :: OutputProperty -> Maybe OutputFormatOptionsProperty
location :: OutputProperty -> S3LocationProperty
maxOutputFiles :: OutputProperty -> Maybe (Value Integer)
overwrite :: OutputProperty -> Maybe (Value Bool)
partitionColumns :: OutputProperty -> Maybe (ValueList Text)
haddock_workaround_ :: ()
compressionFormat :: Maybe (Value Text)
format :: Maybe (Value Text)
formatOptions :: Maybe OutputFormatOptionsProperty
location :: S3LocationProperty
maxOutputFiles :: Maybe (Value Integer)
overwrite :: Maybe (Value Bool)
partitionColumns :: Maybe (ValueList Text)
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::DataBrew::Job.Output",
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
"Location" Key -> S3LocationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= S3LocationProperty
location]
([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
"CompressionFormat" (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)
compressionFormat,
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
"Format" (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)
format,
Key -> OutputFormatOptionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"FormatOptions" (OutputFormatOptionsProperty -> (Key, Value))
-> Maybe OutputFormatOptionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe OutputFormatOptionsProperty
formatOptions,
Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"MaxOutputFiles" (Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
maxOutputFiles,
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
"Overwrite" (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)
overwrite,
Key -> ValueList 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
"PartitionColumns" (ValueList Text -> (Key, Value))
-> Maybe (ValueList Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (ValueList Text)
partitionColumns]))}
instance JSON.ToJSON OutputProperty where
toJSON :: OutputProperty -> Value
toJSON OutputProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe OutputFormatOptionsProperty
()
S3LocationProperty
haddock_workaround_ :: OutputProperty -> ()
compressionFormat :: OutputProperty -> Maybe (Value Text)
format :: OutputProperty -> Maybe (Value Text)
formatOptions :: OutputProperty -> Maybe OutputFormatOptionsProperty
location :: OutputProperty -> S3LocationProperty
maxOutputFiles :: OutputProperty -> Maybe (Value Integer)
overwrite :: OutputProperty -> Maybe (Value Bool)
partitionColumns :: OutputProperty -> Maybe (ValueList Text)
haddock_workaround_ :: ()
compressionFormat :: Maybe (Value Text)
format :: Maybe (Value Text)
formatOptions :: Maybe OutputFormatOptionsProperty
location :: S3LocationProperty
maxOutputFiles :: Maybe (Value Integer)
overwrite :: Maybe (Value Bool)
partitionColumns :: Maybe (ValueList 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
"Location" Key -> S3LocationProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
JSON..= S3LocationProperty
location]
([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
"CompressionFormat" (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)
compressionFormat,
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
"Format" (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)
format,
Key -> OutputFormatOptionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"FormatOptions" (OutputFormatOptionsProperty -> (Key, Value))
-> Maybe OutputFormatOptionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe OutputFormatOptionsProperty
formatOptions,
Key -> Value Integer -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"MaxOutputFiles" (Value Integer -> (Key, Value))
-> Maybe (Value Integer) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (Value Integer)
maxOutputFiles,
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
"Overwrite" (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)
overwrite,
Key -> ValueList 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
"PartitionColumns" (ValueList Text -> (Key, Value))
-> Maybe (ValueList Text) -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe (ValueList Text)
partitionColumns])))
instance Property "CompressionFormat" OutputProperty where
type PropertyType "CompressionFormat" OutputProperty = Value Prelude.Text
set :: PropertyType "CompressionFormat" OutputProperty
-> OutputProperty -> OutputProperty
set PropertyType "CompressionFormat" OutputProperty
newValue OutputProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe OutputFormatOptionsProperty
()
S3LocationProperty
haddock_workaround_ :: OutputProperty -> ()
compressionFormat :: OutputProperty -> Maybe (Value Text)
format :: OutputProperty -> Maybe (Value Text)
formatOptions :: OutputProperty -> Maybe OutputFormatOptionsProperty
location :: OutputProperty -> S3LocationProperty
maxOutputFiles :: OutputProperty -> Maybe (Value Integer)
overwrite :: OutputProperty -> Maybe (Value Bool)
partitionColumns :: OutputProperty -> Maybe (ValueList Text)
haddock_workaround_ :: ()
compressionFormat :: Maybe (Value Text)
format :: Maybe (Value Text)
formatOptions :: Maybe OutputFormatOptionsProperty
location :: S3LocationProperty
maxOutputFiles :: Maybe (Value Integer)
overwrite :: Maybe (Value Bool)
partitionColumns :: Maybe (ValueList Text)
..}
= OutputProperty {compressionFormat :: Maybe (Value Text)
compressionFormat = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "CompressionFormat" OutputProperty
Value Text
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe OutputFormatOptionsProperty
()
S3LocationProperty
haddock_workaround_ :: ()
format :: Maybe (Value Text)
formatOptions :: Maybe OutputFormatOptionsProperty
location :: S3LocationProperty
maxOutputFiles :: Maybe (Value Integer)
overwrite :: Maybe (Value Bool)
partitionColumns :: Maybe (ValueList Text)
haddock_workaround_ :: ()
format :: Maybe (Value Text)
formatOptions :: Maybe OutputFormatOptionsProperty
location :: S3LocationProperty
maxOutputFiles :: Maybe (Value Integer)
overwrite :: Maybe (Value Bool)
partitionColumns :: Maybe (ValueList Text)
..}
instance Property "Format" OutputProperty where
type PropertyType "Format" OutputProperty = Value Prelude.Text
set :: PropertyType "Format" OutputProperty
-> OutputProperty -> OutputProperty
set PropertyType "Format" OutputProperty
newValue OutputProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe OutputFormatOptionsProperty
()
S3LocationProperty
haddock_workaround_ :: OutputProperty -> ()
compressionFormat :: OutputProperty -> Maybe (Value Text)
format :: OutputProperty -> Maybe (Value Text)
formatOptions :: OutputProperty -> Maybe OutputFormatOptionsProperty
location :: OutputProperty -> S3LocationProperty
maxOutputFiles :: OutputProperty -> Maybe (Value Integer)
overwrite :: OutputProperty -> Maybe (Value Bool)
partitionColumns :: OutputProperty -> Maybe (ValueList Text)
haddock_workaround_ :: ()
compressionFormat :: Maybe (Value Text)
format :: Maybe (Value Text)
formatOptions :: Maybe OutputFormatOptionsProperty
location :: S3LocationProperty
maxOutputFiles :: Maybe (Value Integer)
overwrite :: Maybe (Value Bool)
partitionColumns :: Maybe (ValueList Text)
..}
= OutputProperty {format :: Maybe (Value Text)
format = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Format" OutputProperty
Value Text
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe OutputFormatOptionsProperty
()
S3LocationProperty
haddock_workaround_ :: ()
compressionFormat :: Maybe (Value Text)
formatOptions :: Maybe OutputFormatOptionsProperty
location :: S3LocationProperty
maxOutputFiles :: Maybe (Value Integer)
overwrite :: Maybe (Value Bool)
partitionColumns :: Maybe (ValueList Text)
haddock_workaround_ :: ()
compressionFormat :: Maybe (Value Text)
formatOptions :: Maybe OutputFormatOptionsProperty
location :: S3LocationProperty
maxOutputFiles :: Maybe (Value Integer)
overwrite :: Maybe (Value Bool)
partitionColumns :: Maybe (ValueList Text)
..}
instance Property "FormatOptions" OutputProperty where
type PropertyType "FormatOptions" OutputProperty = OutputFormatOptionsProperty
set :: PropertyType "FormatOptions" OutputProperty
-> OutputProperty -> OutputProperty
set PropertyType "FormatOptions" OutputProperty
newValue OutputProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe OutputFormatOptionsProperty
()
S3LocationProperty
haddock_workaround_ :: OutputProperty -> ()
compressionFormat :: OutputProperty -> Maybe (Value Text)
format :: OutputProperty -> Maybe (Value Text)
formatOptions :: OutputProperty -> Maybe OutputFormatOptionsProperty
location :: OutputProperty -> S3LocationProperty
maxOutputFiles :: OutputProperty -> Maybe (Value Integer)
overwrite :: OutputProperty -> Maybe (Value Bool)
partitionColumns :: OutputProperty -> Maybe (ValueList Text)
haddock_workaround_ :: ()
compressionFormat :: Maybe (Value Text)
format :: Maybe (Value Text)
formatOptions :: Maybe OutputFormatOptionsProperty
location :: S3LocationProperty
maxOutputFiles :: Maybe (Value Integer)
overwrite :: Maybe (Value Bool)
partitionColumns :: Maybe (ValueList Text)
..}
= OutputProperty {formatOptions :: Maybe OutputFormatOptionsProperty
formatOptions = OutputFormatOptionsProperty -> Maybe OutputFormatOptionsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "FormatOptions" OutputProperty
OutputFormatOptionsProperty
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
()
S3LocationProperty
haddock_workaround_ :: ()
compressionFormat :: Maybe (Value Text)
format :: Maybe (Value Text)
location :: S3LocationProperty
maxOutputFiles :: Maybe (Value Integer)
overwrite :: Maybe (Value Bool)
partitionColumns :: Maybe (ValueList Text)
haddock_workaround_ :: ()
compressionFormat :: Maybe (Value Text)
format :: Maybe (Value Text)
location :: S3LocationProperty
maxOutputFiles :: Maybe (Value Integer)
overwrite :: Maybe (Value Bool)
partitionColumns :: Maybe (ValueList Text)
..}
instance Property "Location" OutputProperty where
type PropertyType "Location" OutputProperty = S3LocationProperty
set :: PropertyType "Location" OutputProperty
-> OutputProperty -> OutputProperty
set PropertyType "Location" OutputProperty
newValue OutputProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe OutputFormatOptionsProperty
()
S3LocationProperty
haddock_workaround_ :: OutputProperty -> ()
compressionFormat :: OutputProperty -> Maybe (Value Text)
format :: OutputProperty -> Maybe (Value Text)
formatOptions :: OutputProperty -> Maybe OutputFormatOptionsProperty
location :: OutputProperty -> S3LocationProperty
maxOutputFiles :: OutputProperty -> Maybe (Value Integer)
overwrite :: OutputProperty -> Maybe (Value Bool)
partitionColumns :: OutputProperty -> Maybe (ValueList Text)
haddock_workaround_ :: ()
compressionFormat :: Maybe (Value Text)
format :: Maybe (Value Text)
formatOptions :: Maybe OutputFormatOptionsProperty
location :: S3LocationProperty
maxOutputFiles :: Maybe (Value Integer)
overwrite :: Maybe (Value Bool)
partitionColumns :: Maybe (ValueList Text)
..}
= OutputProperty {location :: S3LocationProperty
location = PropertyType "Location" OutputProperty
S3LocationProperty
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe OutputFormatOptionsProperty
()
haddock_workaround_ :: ()
compressionFormat :: Maybe (Value Text)
format :: Maybe (Value Text)
formatOptions :: Maybe OutputFormatOptionsProperty
maxOutputFiles :: Maybe (Value Integer)
overwrite :: Maybe (Value Bool)
partitionColumns :: Maybe (ValueList Text)
haddock_workaround_ :: ()
compressionFormat :: Maybe (Value Text)
format :: Maybe (Value Text)
formatOptions :: Maybe OutputFormatOptionsProperty
maxOutputFiles :: Maybe (Value Integer)
overwrite :: Maybe (Value Bool)
partitionColumns :: Maybe (ValueList Text)
..}
instance Property "MaxOutputFiles" OutputProperty where
type PropertyType "MaxOutputFiles" OutputProperty = Value Prelude.Integer
set :: PropertyType "MaxOutputFiles" OutputProperty
-> OutputProperty -> OutputProperty
set PropertyType "MaxOutputFiles" OutputProperty
newValue OutputProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe OutputFormatOptionsProperty
()
S3LocationProperty
haddock_workaround_ :: OutputProperty -> ()
compressionFormat :: OutputProperty -> Maybe (Value Text)
format :: OutputProperty -> Maybe (Value Text)
formatOptions :: OutputProperty -> Maybe OutputFormatOptionsProperty
location :: OutputProperty -> S3LocationProperty
maxOutputFiles :: OutputProperty -> Maybe (Value Integer)
overwrite :: OutputProperty -> Maybe (Value Bool)
partitionColumns :: OutputProperty -> Maybe (ValueList Text)
haddock_workaround_ :: ()
compressionFormat :: Maybe (Value Text)
format :: Maybe (Value Text)
formatOptions :: Maybe OutputFormatOptionsProperty
location :: S3LocationProperty
maxOutputFiles :: Maybe (Value Integer)
overwrite :: Maybe (Value Bool)
partitionColumns :: Maybe (ValueList Text)
..}
= OutputProperty {maxOutputFiles :: Maybe (Value Integer)
maxOutputFiles = Value Integer -> Maybe (Value Integer)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "MaxOutputFiles" OutputProperty
Value Integer
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe OutputFormatOptionsProperty
()
S3LocationProperty
haddock_workaround_ :: ()
compressionFormat :: Maybe (Value Text)
format :: Maybe (Value Text)
formatOptions :: Maybe OutputFormatOptionsProperty
location :: S3LocationProperty
overwrite :: Maybe (Value Bool)
partitionColumns :: Maybe (ValueList Text)
haddock_workaround_ :: ()
compressionFormat :: Maybe (Value Text)
format :: Maybe (Value Text)
formatOptions :: Maybe OutputFormatOptionsProperty
location :: S3LocationProperty
overwrite :: Maybe (Value Bool)
partitionColumns :: Maybe (ValueList Text)
..}
instance Property "Overwrite" OutputProperty where
type PropertyType "Overwrite" OutputProperty = Value Prelude.Bool
set :: PropertyType "Overwrite" OutputProperty
-> OutputProperty -> OutputProperty
set PropertyType "Overwrite" OutputProperty
newValue OutputProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe OutputFormatOptionsProperty
()
S3LocationProperty
haddock_workaround_ :: OutputProperty -> ()
compressionFormat :: OutputProperty -> Maybe (Value Text)
format :: OutputProperty -> Maybe (Value Text)
formatOptions :: OutputProperty -> Maybe OutputFormatOptionsProperty
location :: OutputProperty -> S3LocationProperty
maxOutputFiles :: OutputProperty -> Maybe (Value Integer)
overwrite :: OutputProperty -> Maybe (Value Bool)
partitionColumns :: OutputProperty -> Maybe (ValueList Text)
haddock_workaround_ :: ()
compressionFormat :: Maybe (Value Text)
format :: Maybe (Value Text)
formatOptions :: Maybe OutputFormatOptionsProperty
location :: S3LocationProperty
maxOutputFiles :: Maybe (Value Integer)
overwrite :: Maybe (Value Bool)
partitionColumns :: Maybe (ValueList Text)
..}
= OutputProperty {overwrite :: Maybe (Value Bool)
overwrite = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Overwrite" OutputProperty
Value Bool
newValue, Maybe (ValueList Text)
Maybe (Value Integer)
Maybe (Value Text)
Maybe OutputFormatOptionsProperty
()
S3LocationProperty
haddock_workaround_ :: ()
compressionFormat :: Maybe (Value Text)
format :: Maybe (Value Text)
formatOptions :: Maybe OutputFormatOptionsProperty
location :: S3LocationProperty
maxOutputFiles :: Maybe (Value Integer)
partitionColumns :: Maybe (ValueList Text)
haddock_workaround_ :: ()
compressionFormat :: Maybe (Value Text)
format :: Maybe (Value Text)
formatOptions :: Maybe OutputFormatOptionsProperty
location :: S3LocationProperty
maxOutputFiles :: Maybe (Value Integer)
partitionColumns :: Maybe (ValueList Text)
..}
instance Property "PartitionColumns" OutputProperty where
type PropertyType "PartitionColumns" OutputProperty = ValueList Prelude.Text
set :: PropertyType "PartitionColumns" OutputProperty
-> OutputProperty -> OutputProperty
set PropertyType "PartitionColumns" OutputProperty
newValue OutputProperty {Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe OutputFormatOptionsProperty
()
S3LocationProperty
haddock_workaround_ :: OutputProperty -> ()
compressionFormat :: OutputProperty -> Maybe (Value Text)
format :: OutputProperty -> Maybe (Value Text)
formatOptions :: OutputProperty -> Maybe OutputFormatOptionsProperty
location :: OutputProperty -> S3LocationProperty
maxOutputFiles :: OutputProperty -> Maybe (Value Integer)
overwrite :: OutputProperty -> Maybe (Value Bool)
partitionColumns :: OutputProperty -> Maybe (ValueList Text)
haddock_workaround_ :: ()
compressionFormat :: Maybe (Value Text)
format :: Maybe (Value Text)
formatOptions :: Maybe OutputFormatOptionsProperty
location :: S3LocationProperty
maxOutputFiles :: Maybe (Value Integer)
overwrite :: Maybe (Value Bool)
partitionColumns :: Maybe (ValueList Text)
..}
= OutputProperty {partitionColumns :: Maybe (ValueList Text)
partitionColumns = ValueList Text -> Maybe (ValueList Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "PartitionColumns" OutputProperty
ValueList Text
newValue, Maybe (Value Bool)
Maybe (Value Integer)
Maybe (Value Text)
Maybe OutputFormatOptionsProperty
()
S3LocationProperty
haddock_workaround_ :: ()
compressionFormat :: Maybe (Value Text)
format :: Maybe (Value Text)
formatOptions :: Maybe OutputFormatOptionsProperty
location :: S3LocationProperty
maxOutputFiles :: Maybe (Value Integer)
overwrite :: Maybe (Value Bool)
haddock_workaround_ :: ()
compressionFormat :: Maybe (Value Text)
format :: Maybe (Value Text)
formatOptions :: Maybe OutputFormatOptionsProperty
location :: S3LocationProperty
maxOutputFiles :: Maybe (Value Integer)
overwrite :: Maybe (Value Bool)
..}