module Stratosphere.QuickSight.Analysis.ScatterPlotFieldWellsProperty (
        module Exports, ScatterPlotFieldWellsProperty(..),
        mkScatterPlotFieldWellsProperty
    ) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.QuickSight.Analysis.ScatterPlotCategoricallyAggregatedFieldWellsProperty as Exports
import {-# SOURCE #-} Stratosphere.QuickSight.Analysis.ScatterPlotUnaggregatedFieldWellsProperty as Exports
import Stratosphere.ResourceProperties
data ScatterPlotFieldWellsProperty
  = -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-quicksight-analysis-scatterplotfieldwells.html>
    ScatterPlotFieldWellsProperty {ScatterPlotFieldWellsProperty -> ()
haddock_workaround_ :: (),
                                   -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-quicksight-analysis-scatterplotfieldwells.html#cfn-quicksight-analysis-scatterplotfieldwells-scatterplotcategoricallyaggregatedfieldwells>
                                   ScatterPlotFieldWellsProperty
-> Maybe ScatterPlotCategoricallyAggregatedFieldWellsProperty
scatterPlotCategoricallyAggregatedFieldWells :: (Prelude.Maybe ScatterPlotCategoricallyAggregatedFieldWellsProperty),
                                   -- | See: <http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-quicksight-analysis-scatterplotfieldwells.html#cfn-quicksight-analysis-scatterplotfieldwells-scatterplotunaggregatedfieldwells>
                                   ScatterPlotFieldWellsProperty
-> Maybe ScatterPlotUnaggregatedFieldWellsProperty
scatterPlotUnaggregatedFieldWells :: (Prelude.Maybe ScatterPlotUnaggregatedFieldWellsProperty)}
  deriving stock (ScatterPlotFieldWellsProperty
-> ScatterPlotFieldWellsProperty -> Bool
(ScatterPlotFieldWellsProperty
 -> ScatterPlotFieldWellsProperty -> Bool)
-> (ScatterPlotFieldWellsProperty
    -> ScatterPlotFieldWellsProperty -> Bool)
-> Eq ScatterPlotFieldWellsProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: ScatterPlotFieldWellsProperty
-> ScatterPlotFieldWellsProperty -> Bool
== :: ScatterPlotFieldWellsProperty
-> ScatterPlotFieldWellsProperty -> Bool
$c/= :: ScatterPlotFieldWellsProperty
-> ScatterPlotFieldWellsProperty -> Bool
/= :: ScatterPlotFieldWellsProperty
-> ScatterPlotFieldWellsProperty -> Bool
Prelude.Eq, Int -> ScatterPlotFieldWellsProperty -> ShowS
[ScatterPlotFieldWellsProperty] -> ShowS
ScatterPlotFieldWellsProperty -> String
(Int -> ScatterPlotFieldWellsProperty -> ShowS)
-> (ScatterPlotFieldWellsProperty -> String)
-> ([ScatterPlotFieldWellsProperty] -> ShowS)
-> Show ScatterPlotFieldWellsProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> ScatterPlotFieldWellsProperty -> ShowS
showsPrec :: Int -> ScatterPlotFieldWellsProperty -> ShowS
$cshow :: ScatterPlotFieldWellsProperty -> String
show :: ScatterPlotFieldWellsProperty -> String
$cshowList :: [ScatterPlotFieldWellsProperty] -> ShowS
showList :: [ScatterPlotFieldWellsProperty] -> ShowS
Prelude.Show)
mkScatterPlotFieldWellsProperty :: ScatterPlotFieldWellsProperty
mkScatterPlotFieldWellsProperty :: ScatterPlotFieldWellsProperty
mkScatterPlotFieldWellsProperty
  = ScatterPlotFieldWellsProperty
      {haddock_workaround_ :: ()
haddock_workaround_ = (),
       scatterPlotCategoricallyAggregatedFieldWells :: Maybe ScatterPlotCategoricallyAggregatedFieldWellsProperty
scatterPlotCategoricallyAggregatedFieldWells = Maybe ScatterPlotCategoricallyAggregatedFieldWellsProperty
forall a. Maybe a
Prelude.Nothing,
       scatterPlotUnaggregatedFieldWells :: Maybe ScatterPlotUnaggregatedFieldWellsProperty
scatterPlotUnaggregatedFieldWells = Maybe ScatterPlotUnaggregatedFieldWellsProperty
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties ScatterPlotFieldWellsProperty where
  toResourceProperties :: ScatterPlotFieldWellsProperty -> ResourceProperties
toResourceProperties ScatterPlotFieldWellsProperty {Maybe ScatterPlotUnaggregatedFieldWellsProperty
Maybe ScatterPlotCategoricallyAggregatedFieldWellsProperty
()
haddock_workaround_ :: ScatterPlotFieldWellsProperty -> ()
scatterPlotCategoricallyAggregatedFieldWells :: ScatterPlotFieldWellsProperty
-> Maybe ScatterPlotCategoricallyAggregatedFieldWellsProperty
scatterPlotUnaggregatedFieldWells :: ScatterPlotFieldWellsProperty
-> Maybe ScatterPlotUnaggregatedFieldWellsProperty
haddock_workaround_ :: ()
scatterPlotCategoricallyAggregatedFieldWells :: Maybe ScatterPlotCategoricallyAggregatedFieldWellsProperty
scatterPlotUnaggregatedFieldWells :: Maybe ScatterPlotUnaggregatedFieldWellsProperty
..}
    = ResourceProperties
        {awsType :: Text
awsType = Text
"AWS::QuickSight::Analysis.ScatterPlotFieldWells",
         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
-> ScatterPlotCategoricallyAggregatedFieldWellsProperty
-> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ScatterPlotCategoricallyAggregatedFieldWells"
                              (ScatterPlotCategoricallyAggregatedFieldWellsProperty
 -> (Key, Value))
-> Maybe ScatterPlotCategoricallyAggregatedFieldWellsProperty
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ScatterPlotCategoricallyAggregatedFieldWellsProperty
scatterPlotCategoricallyAggregatedFieldWells,
                            Key -> ScatterPlotUnaggregatedFieldWellsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ScatterPlotUnaggregatedFieldWells"
                              (ScatterPlotUnaggregatedFieldWellsProperty -> (Key, Value))
-> Maybe ScatterPlotUnaggregatedFieldWellsProperty
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ScatterPlotUnaggregatedFieldWellsProperty
scatterPlotUnaggregatedFieldWells])}
instance JSON.ToJSON ScatterPlotFieldWellsProperty where
  toJSON :: ScatterPlotFieldWellsProperty -> Value
toJSON ScatterPlotFieldWellsProperty {Maybe ScatterPlotUnaggregatedFieldWellsProperty
Maybe ScatterPlotCategoricallyAggregatedFieldWellsProperty
()
haddock_workaround_ :: ScatterPlotFieldWellsProperty -> ()
scatterPlotCategoricallyAggregatedFieldWells :: ScatterPlotFieldWellsProperty
-> Maybe ScatterPlotCategoricallyAggregatedFieldWellsProperty
scatterPlotUnaggregatedFieldWells :: ScatterPlotFieldWellsProperty
-> Maybe ScatterPlotUnaggregatedFieldWellsProperty
haddock_workaround_ :: ()
scatterPlotCategoricallyAggregatedFieldWells :: Maybe ScatterPlotCategoricallyAggregatedFieldWellsProperty
scatterPlotUnaggregatedFieldWells :: Maybe ScatterPlotUnaggregatedFieldWellsProperty
..}
    = [(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
-> ScatterPlotCategoricallyAggregatedFieldWellsProperty
-> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ScatterPlotCategoricallyAggregatedFieldWells"
                 (ScatterPlotCategoricallyAggregatedFieldWellsProperty
 -> (Key, Value))
-> Maybe ScatterPlotCategoricallyAggregatedFieldWellsProperty
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ScatterPlotCategoricallyAggregatedFieldWellsProperty
scatterPlotCategoricallyAggregatedFieldWells,
               Key -> ScatterPlotUnaggregatedFieldWellsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ScatterPlotUnaggregatedFieldWells"
                 (ScatterPlotUnaggregatedFieldWellsProperty -> (Key, Value))
-> Maybe ScatterPlotUnaggregatedFieldWellsProperty
-> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ScatterPlotUnaggregatedFieldWellsProperty
scatterPlotUnaggregatedFieldWells]))
instance Property "ScatterPlotCategoricallyAggregatedFieldWells" ScatterPlotFieldWellsProperty where
  type PropertyType "ScatterPlotCategoricallyAggregatedFieldWells" ScatterPlotFieldWellsProperty = ScatterPlotCategoricallyAggregatedFieldWellsProperty
  set :: PropertyType
  "ScatterPlotCategoricallyAggregatedFieldWells"
  ScatterPlotFieldWellsProperty
-> ScatterPlotFieldWellsProperty -> ScatterPlotFieldWellsProperty
set PropertyType
  "ScatterPlotCategoricallyAggregatedFieldWells"
  ScatterPlotFieldWellsProperty
newValue ScatterPlotFieldWellsProperty {Maybe ScatterPlotUnaggregatedFieldWellsProperty
Maybe ScatterPlotCategoricallyAggregatedFieldWellsProperty
()
haddock_workaround_ :: ScatterPlotFieldWellsProperty -> ()
scatterPlotCategoricallyAggregatedFieldWells :: ScatterPlotFieldWellsProperty
-> Maybe ScatterPlotCategoricallyAggregatedFieldWellsProperty
scatterPlotUnaggregatedFieldWells :: ScatterPlotFieldWellsProperty
-> Maybe ScatterPlotUnaggregatedFieldWellsProperty
haddock_workaround_ :: ()
scatterPlotCategoricallyAggregatedFieldWells :: Maybe ScatterPlotCategoricallyAggregatedFieldWellsProperty
scatterPlotUnaggregatedFieldWells :: Maybe ScatterPlotUnaggregatedFieldWellsProperty
..}
    = ScatterPlotFieldWellsProperty
        {scatterPlotCategoricallyAggregatedFieldWells :: Maybe ScatterPlotCategoricallyAggregatedFieldWellsProperty
scatterPlotCategoricallyAggregatedFieldWells = ScatterPlotCategoricallyAggregatedFieldWellsProperty
-> Maybe ScatterPlotCategoricallyAggregatedFieldWellsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure
                                                          PropertyType
  "ScatterPlotCategoricallyAggregatedFieldWells"
  ScatterPlotFieldWellsProperty
ScatterPlotCategoricallyAggregatedFieldWellsProperty
newValue,
         Maybe ScatterPlotUnaggregatedFieldWellsProperty
()
haddock_workaround_ :: ()
scatterPlotUnaggregatedFieldWells :: Maybe ScatterPlotUnaggregatedFieldWellsProperty
haddock_workaround_ :: ()
scatterPlotUnaggregatedFieldWells :: Maybe ScatterPlotUnaggregatedFieldWellsProperty
..}
instance Property "ScatterPlotUnaggregatedFieldWells" ScatterPlotFieldWellsProperty where
  type PropertyType "ScatterPlotUnaggregatedFieldWells" ScatterPlotFieldWellsProperty = ScatterPlotUnaggregatedFieldWellsProperty
  set :: PropertyType
  "ScatterPlotUnaggregatedFieldWells" ScatterPlotFieldWellsProperty
-> ScatterPlotFieldWellsProperty -> ScatterPlotFieldWellsProperty
set PropertyType
  "ScatterPlotUnaggregatedFieldWells" ScatterPlotFieldWellsProperty
newValue ScatterPlotFieldWellsProperty {Maybe ScatterPlotUnaggregatedFieldWellsProperty
Maybe ScatterPlotCategoricallyAggregatedFieldWellsProperty
()
haddock_workaround_ :: ScatterPlotFieldWellsProperty -> ()
scatterPlotCategoricallyAggregatedFieldWells :: ScatterPlotFieldWellsProperty
-> Maybe ScatterPlotCategoricallyAggregatedFieldWellsProperty
scatterPlotUnaggregatedFieldWells :: ScatterPlotFieldWellsProperty
-> Maybe ScatterPlotUnaggregatedFieldWellsProperty
haddock_workaround_ :: ()
scatterPlotCategoricallyAggregatedFieldWells :: Maybe ScatterPlotCategoricallyAggregatedFieldWellsProperty
scatterPlotUnaggregatedFieldWells :: Maybe ScatterPlotUnaggregatedFieldWellsProperty
..}
    = ScatterPlotFieldWellsProperty
        {scatterPlotUnaggregatedFieldWells :: Maybe ScatterPlotUnaggregatedFieldWellsProperty
scatterPlotUnaggregatedFieldWells = ScatterPlotUnaggregatedFieldWellsProperty
-> Maybe ScatterPlotUnaggregatedFieldWellsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
  "ScatterPlotUnaggregatedFieldWells" ScatterPlotFieldWellsProperty
ScatterPlotUnaggregatedFieldWellsProperty
newValue, Maybe ScatterPlotCategoricallyAggregatedFieldWellsProperty
()
haddock_workaround_ :: ()
scatterPlotCategoricallyAggregatedFieldWells :: Maybe ScatterPlotCategoricallyAggregatedFieldWellsProperty
haddock_workaround_ :: ()
scatterPlotCategoricallyAggregatedFieldWells :: Maybe ScatterPlotCategoricallyAggregatedFieldWellsProperty
..}