module Stratosphere.CleanRoomsML.TrainingDataset.ColumnSchemaProperty (
        ColumnSchemaProperty(..), mkColumnSchemaProperty
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data ColumnSchemaProperty
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-cleanroomsml-trainingdataset-columnschema.html>
    ColumnSchemaProperty {ColumnSchemaProperty -> ()
haddock_workaround_ :: (),
                          -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-cleanroomsml-trainingdataset-columnschema.html#cfn-cleanroomsml-trainingdataset-columnschema-columnname>
                          ColumnSchemaProperty -> Value Text
columnName :: (Value Prelude.Text),
                          -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-cleanroomsml-trainingdataset-columnschema.html#cfn-cleanroomsml-trainingdataset-columnschema-columntypes>
                          ColumnSchemaProperty -> ValueList Text
columnTypes :: (ValueList Prelude.Text)}
  deriving stock (ColumnSchemaProperty -> ColumnSchemaProperty -> Bool
(ColumnSchemaProperty -> ColumnSchemaProperty -> Bool)
-> (ColumnSchemaProperty -> ColumnSchemaProperty -> Bool)
-> Eq ColumnSchemaProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: ColumnSchemaProperty -> ColumnSchemaProperty -> Bool
== :: ColumnSchemaProperty -> ColumnSchemaProperty -> Bool
$c/= :: ColumnSchemaProperty -> ColumnSchemaProperty -> Bool
/= :: ColumnSchemaProperty -> ColumnSchemaProperty -> Bool
Prelude.Eq, Int -> ColumnSchemaProperty -> ShowS
[ColumnSchemaProperty] -> ShowS
ColumnSchemaProperty -> String
(Int -> ColumnSchemaProperty -> ShowS)
-> (ColumnSchemaProperty -> String)
-> ([ColumnSchemaProperty] -> ShowS)
-> Show ColumnSchemaProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> ColumnSchemaProperty -> ShowS
showsPrec :: Int -> ColumnSchemaProperty -> ShowS
$cshow :: ColumnSchemaProperty -> String
show :: ColumnSchemaProperty -> String
$cshowList :: [ColumnSchemaProperty] -> ShowS
showList :: [ColumnSchemaProperty] -> ShowS
Prelude.Show)
mkColumnSchemaProperty ::
  Value Prelude.Text
  -> ValueList Prelude.Text -> ColumnSchemaProperty
mkColumnSchemaProperty :: Value Text -> ValueList Text -> ColumnSchemaProperty
mkColumnSchemaProperty Value Text
columnName ValueList Text
columnTypes
  = ColumnSchemaProperty
      {haddock_workaround_ :: ()
haddock_workaround_ = (), columnName :: Value Text
columnName = Value Text
columnName,
       columnTypes :: ValueList Text
columnTypes = ValueList Text
columnTypes}
instance ToResourceProperties ColumnSchemaProperty where
  toResourceProperties :: ColumnSchemaProperty -> ResourceProperties
toResourceProperties ColumnSchemaProperty {()
ValueList Text
Value Text
haddock_workaround_ :: ColumnSchemaProperty -> ()
columnName :: ColumnSchemaProperty -> Value Text
columnTypes :: ColumnSchemaProperty -> ValueList Text
haddock_workaround_ :: ()
columnName :: Value Text
columnTypes :: ValueList Text
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::CleanRoomsML::TrainingDataset.ColumnSchema",
         supportsTags :: Bool
supportsTags = Bool
Prelude.False,
         properties :: Object
properties = [Key
"ColumnName" 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
columnName,
                       Key
"ColumnTypes" 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..= ValueList Text
columnTypes]}
instance JSON.ToJSON ColumnSchemaProperty where
  toJSON :: ColumnSchemaProperty -> Value
toJSON ColumnSchemaProperty {()
ValueList Text
Value Text
haddock_workaround_ :: ColumnSchemaProperty -> ()
columnName :: ColumnSchemaProperty -> Value Text
columnTypes :: ColumnSchemaProperty -> ValueList Text
haddock_workaround_ :: ()
columnName :: Value Text
columnTypes :: ValueList Text
..}
    = [(Key, Value)] -> Value
JSON.object
        [Key
"ColumnName" 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
columnName,
         Key
"ColumnTypes" 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..= ValueList Text
columnTypes]
instance Property "ColumnName" ColumnSchemaProperty where
  type PropertyType "ColumnName" ColumnSchemaProperty = Value Prelude.Text
  set :: PropertyType "ColumnName" ColumnSchemaProperty
-> ColumnSchemaProperty -> ColumnSchemaProperty
set PropertyType "ColumnName" ColumnSchemaProperty
newValue ColumnSchemaProperty {()
ValueList Text
Value Text
haddock_workaround_ :: ColumnSchemaProperty -> ()
columnName :: ColumnSchemaProperty -> Value Text
columnTypes :: ColumnSchemaProperty -> ValueList Text
haddock_workaround_ :: ()
columnName :: Value Text
columnTypes :: ValueList Text
..}
    = ColumnSchemaProperty {columnName :: Value Text
columnName = PropertyType "ColumnName" ColumnSchemaProperty
Value Text
newValue, ()
ValueList Text
haddock_workaround_ :: ()
columnTypes :: ValueList Text
haddock_workaround_ :: ()
columnTypes :: ValueList Text
..}
instance Property "ColumnTypes" ColumnSchemaProperty where
  type PropertyType "ColumnTypes" ColumnSchemaProperty = ValueList Prelude.Text
  set :: PropertyType "ColumnTypes" ColumnSchemaProperty
-> ColumnSchemaProperty -> ColumnSchemaProperty
set PropertyType "ColumnTypes" ColumnSchemaProperty
newValue ColumnSchemaProperty {()
ValueList Text
Value Text
haddock_workaround_ :: ColumnSchemaProperty -> ()
columnName :: ColumnSchemaProperty -> Value Text
columnTypes :: ColumnSchemaProperty -> ValueList Text
haddock_workaround_ :: ()
columnName :: Value Text
columnTypes :: ValueList Text
..}
    = ColumnSchemaProperty {columnTypes :: ValueList Text
columnTypes = PropertyType "ColumnTypes" ColumnSchemaProperty
ValueList Text
newValue, ()
Value Text
haddock_workaround_ :: ()
columnName :: Value Text
haddock_workaround_ :: ()
columnName :: Value Text
..}