module Stratosphere.QuickSight.Topic.TopicCalculatedFieldProperty (
module Exports, TopicCalculatedFieldProperty(..),
mkTopicCalculatedFieldProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.QuickSight.Topic.CellValueSynonymProperty as Exports
import {-# SOURCE #-} Stratosphere.QuickSight.Topic.ComparativeOrderProperty as Exports
import {-# SOURCE #-} Stratosphere.QuickSight.Topic.DefaultFormattingProperty as Exports
import {-# SOURCE #-} Stratosphere.QuickSight.Topic.SemanticTypeProperty as Exports
import Stratosphere.ResourceProperties
import Stratosphere.Value
data TopicCalculatedFieldProperty
=
TopicCalculatedFieldProperty {TopicCalculatedFieldProperty -> ()
haddock_workaround_ :: (),
TopicCalculatedFieldProperty -> Maybe (Value Text)
aggregation :: (Prelude.Maybe (Value Prelude.Text)),
TopicCalculatedFieldProperty -> Maybe (ValueList Text)
allowedAggregations :: (Prelude.Maybe (ValueList Prelude.Text)),
TopicCalculatedFieldProperty -> Maybe (Value Text)
calculatedFieldDescription :: (Prelude.Maybe (Value Prelude.Text)),
TopicCalculatedFieldProperty -> Value Text
calculatedFieldName :: (Value Prelude.Text),
TopicCalculatedFieldProperty -> Maybe (ValueList Text)
calculatedFieldSynonyms :: (Prelude.Maybe (ValueList Prelude.Text)),
TopicCalculatedFieldProperty -> Maybe [CellValueSynonymProperty]
cellValueSynonyms :: (Prelude.Maybe [CellValueSynonymProperty]),
TopicCalculatedFieldProperty -> Maybe (Value Text)
columnDataRole :: (Prelude.Maybe (Value Prelude.Text)),
TopicCalculatedFieldProperty -> Maybe ComparativeOrderProperty
comparativeOrder :: (Prelude.Maybe ComparativeOrderProperty),
TopicCalculatedFieldProperty -> Maybe DefaultFormattingProperty
defaultFormatting :: (Prelude.Maybe DefaultFormattingProperty),
TopicCalculatedFieldProperty -> Maybe (Value Bool)
disableIndexing :: (Prelude.Maybe (Value Prelude.Bool)),
TopicCalculatedFieldProperty -> Value Text
expression :: (Value Prelude.Text),
TopicCalculatedFieldProperty -> Maybe (Value Bool)
isIncludedInTopic :: (Prelude.Maybe (Value Prelude.Bool)),
TopicCalculatedFieldProperty -> Maybe (Value Bool)
neverAggregateInFilter :: (Prelude.Maybe (Value Prelude.Bool)),
TopicCalculatedFieldProperty -> Maybe (Value Bool)
nonAdditive :: (Prelude.Maybe (Value Prelude.Bool)),
TopicCalculatedFieldProperty -> Maybe (ValueList Text)
notAllowedAggregations :: (Prelude.Maybe (ValueList Prelude.Text)),
TopicCalculatedFieldProperty -> Maybe SemanticTypeProperty
semanticType :: (Prelude.Maybe SemanticTypeProperty),
TopicCalculatedFieldProperty -> Maybe (Value Text)
timeGranularity :: (Prelude.Maybe (Value Prelude.Text))}
deriving stock (TopicCalculatedFieldProperty
-> TopicCalculatedFieldProperty -> Bool
(TopicCalculatedFieldProperty
-> TopicCalculatedFieldProperty -> Bool)
-> (TopicCalculatedFieldProperty
-> TopicCalculatedFieldProperty -> Bool)
-> Eq TopicCalculatedFieldProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: TopicCalculatedFieldProperty
-> TopicCalculatedFieldProperty -> Bool
== :: TopicCalculatedFieldProperty
-> TopicCalculatedFieldProperty -> Bool
$c/= :: TopicCalculatedFieldProperty
-> TopicCalculatedFieldProperty -> Bool
/= :: TopicCalculatedFieldProperty
-> TopicCalculatedFieldProperty -> Bool
Prelude.Eq, Int -> TopicCalculatedFieldProperty -> ShowS
[TopicCalculatedFieldProperty] -> ShowS
TopicCalculatedFieldProperty -> String
(Int -> TopicCalculatedFieldProperty -> ShowS)
-> (TopicCalculatedFieldProperty -> String)
-> ([TopicCalculatedFieldProperty] -> ShowS)
-> Show TopicCalculatedFieldProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> TopicCalculatedFieldProperty -> ShowS
showsPrec :: Int -> TopicCalculatedFieldProperty -> ShowS
$cshow :: TopicCalculatedFieldProperty -> String
show :: TopicCalculatedFieldProperty -> String
$cshowList :: [TopicCalculatedFieldProperty] -> ShowS
showList :: [TopicCalculatedFieldProperty] -> ShowS
Prelude.Show)
mkTopicCalculatedFieldProperty ::
Value Prelude.Text
-> Value Prelude.Text -> TopicCalculatedFieldProperty
mkTopicCalculatedFieldProperty :: Value Text -> Value Text -> TopicCalculatedFieldProperty
mkTopicCalculatedFieldProperty Value Text
calculatedFieldName Value Text
expression
= TopicCalculatedFieldProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (),
calculatedFieldName :: Value Text
calculatedFieldName = Value Text
calculatedFieldName, expression :: Value Text
expression = Value Text
expression,
aggregation :: Maybe (Value Text)
aggregation = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
allowedAggregations :: Maybe (ValueList Text)
allowedAggregations = Maybe (ValueList Text)
forall a. Maybe a
Prelude.Nothing,
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldDescription = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
calculatedFieldSynonyms :: Maybe (ValueList Text)
calculatedFieldSynonyms = Maybe (ValueList Text)
forall a. Maybe a
Prelude.Nothing,
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
cellValueSynonyms = Maybe [CellValueSynonymProperty]
forall a. Maybe a
Prelude.Nothing,
columnDataRole :: Maybe (Value Text)
columnDataRole = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
comparativeOrder :: Maybe ComparativeOrderProperty
comparativeOrder = Maybe ComparativeOrderProperty
forall a. Maybe a
Prelude.Nothing,
defaultFormatting :: Maybe DefaultFormattingProperty
defaultFormatting = Maybe DefaultFormattingProperty
forall a. Maybe a
Prelude.Nothing,
disableIndexing :: Maybe (Value Bool)
disableIndexing = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
isIncludedInTopic :: Maybe (Value Bool)
isIncludedInTopic = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
neverAggregateInFilter :: Maybe (Value Bool)
neverAggregateInFilter = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
nonAdditive :: Maybe (Value Bool)
nonAdditive = Maybe (Value Bool)
forall a. Maybe a
Prelude.Nothing,
notAllowedAggregations :: Maybe (ValueList Text)
notAllowedAggregations = Maybe (ValueList Text)
forall a. Maybe a
Prelude.Nothing,
semanticType :: Maybe SemanticTypeProperty
semanticType = Maybe SemanticTypeProperty
forall a. Maybe a
Prelude.Nothing, timeGranularity :: Maybe (Value Text)
timeGranularity = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties TopicCalculatedFieldProperty where
toResourceProperties :: TopicCalculatedFieldProperty -> ResourceProperties
toResourceProperties TopicCalculatedFieldProperty {Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: TopicCalculatedFieldProperty -> ()
aggregation :: TopicCalculatedFieldProperty -> Maybe (Value Text)
allowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
calculatedFieldDescription :: TopicCalculatedFieldProperty -> Maybe (Value Text)
calculatedFieldName :: TopicCalculatedFieldProperty -> Value Text
calculatedFieldSynonyms :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
cellValueSynonyms :: TopicCalculatedFieldProperty -> Maybe [CellValueSynonymProperty]
columnDataRole :: TopicCalculatedFieldProperty -> Maybe (Value Text)
comparativeOrder :: TopicCalculatedFieldProperty -> Maybe ComparativeOrderProperty
defaultFormatting :: TopicCalculatedFieldProperty -> Maybe DefaultFormattingProperty
disableIndexing :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
expression :: TopicCalculatedFieldProperty -> Value Text
isIncludedInTopic :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
neverAggregateInFilter :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
nonAdditive :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
notAllowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
semanticType :: TopicCalculatedFieldProperty -> Maybe SemanticTypeProperty
timeGranularity :: TopicCalculatedFieldProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::QuickSight::Topic.TopicCalculatedField",
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
"CalculatedFieldName" 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
calculatedFieldName,
Key
"Expression" 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
expression]
([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
"Aggregation" (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)
aggregation,
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
"AllowedAggregations" (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)
allowedAggregations,
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
"CalculatedFieldDescription"
(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)
calculatedFieldDescription,
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
"CalculatedFieldSynonyms"
(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)
calculatedFieldSynonyms,
Key -> [CellValueSynonymProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"CellValueSynonyms" ([CellValueSynonymProperty] -> (Key, Value))
-> Maybe [CellValueSynonymProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [CellValueSynonymProperty]
cellValueSynonyms,
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
"ColumnDataRole" (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)
columnDataRole,
Key -> ComparativeOrderProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ComparativeOrder" (ComparativeOrderProperty -> (Key, Value))
-> Maybe ComparativeOrderProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ComparativeOrderProperty
comparativeOrder,
Key -> DefaultFormattingProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"DefaultFormatting" (DefaultFormattingProperty -> (Key, Value))
-> Maybe DefaultFormattingProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe DefaultFormattingProperty
defaultFormatting,
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
"DisableIndexing" (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)
disableIndexing,
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
"IsIncludedInTopic" (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)
isIncludedInTopic,
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
"NeverAggregateInFilter"
(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)
neverAggregateInFilter,
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
"NonAdditive" (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)
nonAdditive,
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
"NotAllowedAggregations"
(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)
notAllowedAggregations,
Key -> SemanticTypeProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SemanticType" (SemanticTypeProperty -> (Key, Value))
-> Maybe SemanticTypeProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe SemanticTypeProperty
semanticType,
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
"TimeGranularity" (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)
timeGranularity]))}
instance JSON.ToJSON TopicCalculatedFieldProperty where
toJSON :: TopicCalculatedFieldProperty -> Value
toJSON TopicCalculatedFieldProperty {Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: TopicCalculatedFieldProperty -> ()
aggregation :: TopicCalculatedFieldProperty -> Maybe (Value Text)
allowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
calculatedFieldDescription :: TopicCalculatedFieldProperty -> Maybe (Value Text)
calculatedFieldName :: TopicCalculatedFieldProperty -> Value Text
calculatedFieldSynonyms :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
cellValueSynonyms :: TopicCalculatedFieldProperty -> Maybe [CellValueSynonymProperty]
columnDataRole :: TopicCalculatedFieldProperty -> Maybe (Value Text)
comparativeOrder :: TopicCalculatedFieldProperty -> Maybe ComparativeOrderProperty
defaultFormatting :: TopicCalculatedFieldProperty -> Maybe DefaultFormattingProperty
disableIndexing :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
expression :: TopicCalculatedFieldProperty -> Value Text
isIncludedInTopic :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
neverAggregateInFilter :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
nonAdditive :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
notAllowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
semanticType :: TopicCalculatedFieldProperty -> Maybe SemanticTypeProperty
timeGranularity :: TopicCalculatedFieldProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: 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
"CalculatedFieldName" 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
calculatedFieldName,
Key
"Expression" 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
expression]
([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
"Aggregation" (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)
aggregation,
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
"AllowedAggregations" (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)
allowedAggregations,
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
"CalculatedFieldDescription"
(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)
calculatedFieldDescription,
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
"CalculatedFieldSynonyms"
(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)
calculatedFieldSynonyms,
Key -> [CellValueSynonymProperty] -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"CellValueSynonyms" ([CellValueSynonymProperty] -> (Key, Value))
-> Maybe [CellValueSynonymProperty] -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [CellValueSynonymProperty]
cellValueSynonyms,
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
"ColumnDataRole" (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)
columnDataRole,
Key -> ComparativeOrderProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"ComparativeOrder" (ComparativeOrderProperty -> (Key, Value))
-> Maybe ComparativeOrderProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe ComparativeOrderProperty
comparativeOrder,
Key -> DefaultFormattingProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"DefaultFormatting" (DefaultFormattingProperty -> (Key, Value))
-> Maybe DefaultFormattingProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe DefaultFormattingProperty
defaultFormatting,
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
"DisableIndexing" (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)
disableIndexing,
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
"IsIncludedInTopic" (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)
isIncludedInTopic,
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
"NeverAggregateInFilter"
(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)
neverAggregateInFilter,
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
"NonAdditive" (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)
nonAdditive,
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
"NotAllowedAggregations"
(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)
notAllowedAggregations,
Key -> SemanticTypeProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"SemanticType" (SemanticTypeProperty -> (Key, Value))
-> Maybe SemanticTypeProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe SemanticTypeProperty
semanticType,
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
"TimeGranularity" (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)
timeGranularity])))
instance Property "Aggregation" TopicCalculatedFieldProperty where
type PropertyType "Aggregation" TopicCalculatedFieldProperty = Value Prelude.Text
set :: PropertyType "Aggregation" TopicCalculatedFieldProperty
-> TopicCalculatedFieldProperty -> TopicCalculatedFieldProperty
set PropertyType "Aggregation" TopicCalculatedFieldProperty
newValue TopicCalculatedFieldProperty {Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: TopicCalculatedFieldProperty -> ()
aggregation :: TopicCalculatedFieldProperty -> Maybe (Value Text)
allowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
calculatedFieldDescription :: TopicCalculatedFieldProperty -> Maybe (Value Text)
calculatedFieldName :: TopicCalculatedFieldProperty -> Value Text
calculatedFieldSynonyms :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
cellValueSynonyms :: TopicCalculatedFieldProperty -> Maybe [CellValueSynonymProperty]
columnDataRole :: TopicCalculatedFieldProperty -> Maybe (Value Text)
comparativeOrder :: TopicCalculatedFieldProperty -> Maybe ComparativeOrderProperty
defaultFormatting :: TopicCalculatedFieldProperty -> Maybe DefaultFormattingProperty
disableIndexing :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
expression :: TopicCalculatedFieldProperty -> Value Text
isIncludedInTopic :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
neverAggregateInFilter :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
nonAdditive :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
notAllowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
semanticType :: TopicCalculatedFieldProperty -> Maybe SemanticTypeProperty
timeGranularity :: TopicCalculatedFieldProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
= TopicCalculatedFieldProperty
{aggregation :: Maybe (Value Text)
aggregation = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Aggregation" TopicCalculatedFieldProperty
Value Text
newValue, Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: ()
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
haddock_workaround_ :: ()
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
instance Property "AllowedAggregations" TopicCalculatedFieldProperty where
type PropertyType "AllowedAggregations" TopicCalculatedFieldProperty = ValueList Prelude.Text
set :: PropertyType "AllowedAggregations" TopicCalculatedFieldProperty
-> TopicCalculatedFieldProperty -> TopicCalculatedFieldProperty
set PropertyType "AllowedAggregations" TopicCalculatedFieldProperty
newValue TopicCalculatedFieldProperty {Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: TopicCalculatedFieldProperty -> ()
aggregation :: TopicCalculatedFieldProperty -> Maybe (Value Text)
allowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
calculatedFieldDescription :: TopicCalculatedFieldProperty -> Maybe (Value Text)
calculatedFieldName :: TopicCalculatedFieldProperty -> Value Text
calculatedFieldSynonyms :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
cellValueSynonyms :: TopicCalculatedFieldProperty -> Maybe [CellValueSynonymProperty]
columnDataRole :: TopicCalculatedFieldProperty -> Maybe (Value Text)
comparativeOrder :: TopicCalculatedFieldProperty -> Maybe ComparativeOrderProperty
defaultFormatting :: TopicCalculatedFieldProperty -> Maybe DefaultFormattingProperty
disableIndexing :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
expression :: TopicCalculatedFieldProperty -> Value Text
isIncludedInTopic :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
neverAggregateInFilter :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
nonAdditive :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
notAllowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
semanticType :: TopicCalculatedFieldProperty -> Maybe SemanticTypeProperty
timeGranularity :: TopicCalculatedFieldProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
= TopicCalculatedFieldProperty
{allowedAggregations :: Maybe (ValueList Text)
allowedAggregations = ValueList Text -> Maybe (ValueList Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "AllowedAggregations" TopicCalculatedFieldProperty
ValueList Text
newValue, Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
instance Property "CalculatedFieldDescription" TopicCalculatedFieldProperty where
type PropertyType "CalculatedFieldDescription" TopicCalculatedFieldProperty = Value Prelude.Text
set :: PropertyType
"CalculatedFieldDescription" TopicCalculatedFieldProperty
-> TopicCalculatedFieldProperty -> TopicCalculatedFieldProperty
set PropertyType
"CalculatedFieldDescription" TopicCalculatedFieldProperty
newValue TopicCalculatedFieldProperty {Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: TopicCalculatedFieldProperty -> ()
aggregation :: TopicCalculatedFieldProperty -> Maybe (Value Text)
allowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
calculatedFieldDescription :: TopicCalculatedFieldProperty -> Maybe (Value Text)
calculatedFieldName :: TopicCalculatedFieldProperty -> Value Text
calculatedFieldSynonyms :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
cellValueSynonyms :: TopicCalculatedFieldProperty -> Maybe [CellValueSynonymProperty]
columnDataRole :: TopicCalculatedFieldProperty -> Maybe (Value Text)
comparativeOrder :: TopicCalculatedFieldProperty -> Maybe ComparativeOrderProperty
defaultFormatting :: TopicCalculatedFieldProperty -> Maybe DefaultFormattingProperty
disableIndexing :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
expression :: TopicCalculatedFieldProperty -> Value Text
isIncludedInTopic :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
neverAggregateInFilter :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
nonAdditive :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
notAllowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
semanticType :: TopicCalculatedFieldProperty -> Maybe SemanticTypeProperty
timeGranularity :: TopicCalculatedFieldProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
= TopicCalculatedFieldProperty
{calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldDescription = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType
"CalculatedFieldDescription" TopicCalculatedFieldProperty
Value Text
newValue, Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
instance Property "CalculatedFieldName" TopicCalculatedFieldProperty where
type PropertyType "CalculatedFieldName" TopicCalculatedFieldProperty = Value Prelude.Text
set :: PropertyType "CalculatedFieldName" TopicCalculatedFieldProperty
-> TopicCalculatedFieldProperty -> TopicCalculatedFieldProperty
set PropertyType "CalculatedFieldName" TopicCalculatedFieldProperty
newValue TopicCalculatedFieldProperty {Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: TopicCalculatedFieldProperty -> ()
aggregation :: TopicCalculatedFieldProperty -> Maybe (Value Text)
allowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
calculatedFieldDescription :: TopicCalculatedFieldProperty -> Maybe (Value Text)
calculatedFieldName :: TopicCalculatedFieldProperty -> Value Text
calculatedFieldSynonyms :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
cellValueSynonyms :: TopicCalculatedFieldProperty -> Maybe [CellValueSynonymProperty]
columnDataRole :: TopicCalculatedFieldProperty -> Maybe (Value Text)
comparativeOrder :: TopicCalculatedFieldProperty -> Maybe ComparativeOrderProperty
defaultFormatting :: TopicCalculatedFieldProperty -> Maybe DefaultFormattingProperty
disableIndexing :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
expression :: TopicCalculatedFieldProperty -> Value Text
isIncludedInTopic :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
neverAggregateInFilter :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
nonAdditive :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
notAllowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
semanticType :: TopicCalculatedFieldProperty -> Maybe SemanticTypeProperty
timeGranularity :: TopicCalculatedFieldProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
= TopicCalculatedFieldProperty {calculatedFieldName :: Value Text
calculatedFieldName = PropertyType "CalculatedFieldName" TopicCalculatedFieldProperty
Value Text
newValue, Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
instance Property "CalculatedFieldSynonyms" TopicCalculatedFieldProperty where
type PropertyType "CalculatedFieldSynonyms" TopicCalculatedFieldProperty = ValueList Prelude.Text
set :: PropertyType "CalculatedFieldSynonyms" TopicCalculatedFieldProperty
-> TopicCalculatedFieldProperty -> TopicCalculatedFieldProperty
set PropertyType "CalculatedFieldSynonyms" TopicCalculatedFieldProperty
newValue TopicCalculatedFieldProperty {Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: TopicCalculatedFieldProperty -> ()
aggregation :: TopicCalculatedFieldProperty -> Maybe (Value Text)
allowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
calculatedFieldDescription :: TopicCalculatedFieldProperty -> Maybe (Value Text)
calculatedFieldName :: TopicCalculatedFieldProperty -> Value Text
calculatedFieldSynonyms :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
cellValueSynonyms :: TopicCalculatedFieldProperty -> Maybe [CellValueSynonymProperty]
columnDataRole :: TopicCalculatedFieldProperty -> Maybe (Value Text)
comparativeOrder :: TopicCalculatedFieldProperty -> Maybe ComparativeOrderProperty
defaultFormatting :: TopicCalculatedFieldProperty -> Maybe DefaultFormattingProperty
disableIndexing :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
expression :: TopicCalculatedFieldProperty -> Value Text
isIncludedInTopic :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
neverAggregateInFilter :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
nonAdditive :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
notAllowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
semanticType :: TopicCalculatedFieldProperty -> Maybe SemanticTypeProperty
timeGranularity :: TopicCalculatedFieldProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
= TopicCalculatedFieldProperty
{calculatedFieldSynonyms :: Maybe (ValueList Text)
calculatedFieldSynonyms = ValueList Text -> Maybe (ValueList Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "CalculatedFieldSynonyms" TopicCalculatedFieldProperty
ValueList Text
newValue, Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
instance Property "CellValueSynonyms" TopicCalculatedFieldProperty where
type PropertyType "CellValueSynonyms" TopicCalculatedFieldProperty = [CellValueSynonymProperty]
set :: PropertyType "CellValueSynonyms" TopicCalculatedFieldProperty
-> TopicCalculatedFieldProperty -> TopicCalculatedFieldProperty
set PropertyType "CellValueSynonyms" TopicCalculatedFieldProperty
newValue TopicCalculatedFieldProperty {Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: TopicCalculatedFieldProperty -> ()
aggregation :: TopicCalculatedFieldProperty -> Maybe (Value Text)
allowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
calculatedFieldDescription :: TopicCalculatedFieldProperty -> Maybe (Value Text)
calculatedFieldName :: TopicCalculatedFieldProperty -> Value Text
calculatedFieldSynonyms :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
cellValueSynonyms :: TopicCalculatedFieldProperty -> Maybe [CellValueSynonymProperty]
columnDataRole :: TopicCalculatedFieldProperty -> Maybe (Value Text)
comparativeOrder :: TopicCalculatedFieldProperty -> Maybe ComparativeOrderProperty
defaultFormatting :: TopicCalculatedFieldProperty -> Maybe DefaultFormattingProperty
disableIndexing :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
expression :: TopicCalculatedFieldProperty -> Value Text
isIncludedInTopic :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
neverAggregateInFilter :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
nonAdditive :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
notAllowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
semanticType :: TopicCalculatedFieldProperty -> Maybe SemanticTypeProperty
timeGranularity :: TopicCalculatedFieldProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
= TopicCalculatedFieldProperty
{cellValueSynonyms :: Maybe [CellValueSynonymProperty]
cellValueSynonyms = [CellValueSynonymProperty] -> Maybe [CellValueSynonymProperty]
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure [CellValueSynonymProperty]
PropertyType "CellValueSynonyms" TopicCalculatedFieldProperty
newValue, Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
instance Property "ColumnDataRole" TopicCalculatedFieldProperty where
type PropertyType "ColumnDataRole" TopicCalculatedFieldProperty = Value Prelude.Text
set :: PropertyType "ColumnDataRole" TopicCalculatedFieldProperty
-> TopicCalculatedFieldProperty -> TopicCalculatedFieldProperty
set PropertyType "ColumnDataRole" TopicCalculatedFieldProperty
newValue TopicCalculatedFieldProperty {Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: TopicCalculatedFieldProperty -> ()
aggregation :: TopicCalculatedFieldProperty -> Maybe (Value Text)
allowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
calculatedFieldDescription :: TopicCalculatedFieldProperty -> Maybe (Value Text)
calculatedFieldName :: TopicCalculatedFieldProperty -> Value Text
calculatedFieldSynonyms :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
cellValueSynonyms :: TopicCalculatedFieldProperty -> Maybe [CellValueSynonymProperty]
columnDataRole :: TopicCalculatedFieldProperty -> Maybe (Value Text)
comparativeOrder :: TopicCalculatedFieldProperty -> Maybe ComparativeOrderProperty
defaultFormatting :: TopicCalculatedFieldProperty -> Maybe DefaultFormattingProperty
disableIndexing :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
expression :: TopicCalculatedFieldProperty -> Value Text
isIncludedInTopic :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
neverAggregateInFilter :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
nonAdditive :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
notAllowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
semanticType :: TopicCalculatedFieldProperty -> Maybe SemanticTypeProperty
timeGranularity :: TopicCalculatedFieldProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
= TopicCalculatedFieldProperty
{columnDataRole :: Maybe (Value Text)
columnDataRole = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ColumnDataRole" TopicCalculatedFieldProperty
Value Text
newValue, Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
instance Property "ComparativeOrder" TopicCalculatedFieldProperty where
type PropertyType "ComparativeOrder" TopicCalculatedFieldProperty = ComparativeOrderProperty
set :: PropertyType "ComparativeOrder" TopicCalculatedFieldProperty
-> TopicCalculatedFieldProperty -> TopicCalculatedFieldProperty
set PropertyType "ComparativeOrder" TopicCalculatedFieldProperty
newValue TopicCalculatedFieldProperty {Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: TopicCalculatedFieldProperty -> ()
aggregation :: TopicCalculatedFieldProperty -> Maybe (Value Text)
allowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
calculatedFieldDescription :: TopicCalculatedFieldProperty -> Maybe (Value Text)
calculatedFieldName :: TopicCalculatedFieldProperty -> Value Text
calculatedFieldSynonyms :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
cellValueSynonyms :: TopicCalculatedFieldProperty -> Maybe [CellValueSynonymProperty]
columnDataRole :: TopicCalculatedFieldProperty -> Maybe (Value Text)
comparativeOrder :: TopicCalculatedFieldProperty -> Maybe ComparativeOrderProperty
defaultFormatting :: TopicCalculatedFieldProperty -> Maybe DefaultFormattingProperty
disableIndexing :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
expression :: TopicCalculatedFieldProperty -> Value Text
isIncludedInTopic :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
neverAggregateInFilter :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
nonAdditive :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
notAllowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
semanticType :: TopicCalculatedFieldProperty -> Maybe SemanticTypeProperty
timeGranularity :: TopicCalculatedFieldProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
= TopicCalculatedFieldProperty
{comparativeOrder :: Maybe ComparativeOrderProperty
comparativeOrder = ComparativeOrderProperty -> Maybe ComparativeOrderProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "ComparativeOrder" TopicCalculatedFieldProperty
ComparativeOrderProperty
newValue, Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
instance Property "DefaultFormatting" TopicCalculatedFieldProperty where
type PropertyType "DefaultFormatting" TopicCalculatedFieldProperty = DefaultFormattingProperty
set :: PropertyType "DefaultFormatting" TopicCalculatedFieldProperty
-> TopicCalculatedFieldProperty -> TopicCalculatedFieldProperty
set PropertyType "DefaultFormatting" TopicCalculatedFieldProperty
newValue TopicCalculatedFieldProperty {Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: TopicCalculatedFieldProperty -> ()
aggregation :: TopicCalculatedFieldProperty -> Maybe (Value Text)
allowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
calculatedFieldDescription :: TopicCalculatedFieldProperty -> Maybe (Value Text)
calculatedFieldName :: TopicCalculatedFieldProperty -> Value Text
calculatedFieldSynonyms :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
cellValueSynonyms :: TopicCalculatedFieldProperty -> Maybe [CellValueSynonymProperty]
columnDataRole :: TopicCalculatedFieldProperty -> Maybe (Value Text)
comparativeOrder :: TopicCalculatedFieldProperty -> Maybe ComparativeOrderProperty
defaultFormatting :: TopicCalculatedFieldProperty -> Maybe DefaultFormattingProperty
disableIndexing :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
expression :: TopicCalculatedFieldProperty -> Value Text
isIncludedInTopic :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
neverAggregateInFilter :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
nonAdditive :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
notAllowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
semanticType :: TopicCalculatedFieldProperty -> Maybe SemanticTypeProperty
timeGranularity :: TopicCalculatedFieldProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
= TopicCalculatedFieldProperty
{defaultFormatting :: Maybe DefaultFormattingProperty
defaultFormatting = DefaultFormattingProperty -> Maybe DefaultFormattingProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "DefaultFormatting" TopicCalculatedFieldProperty
DefaultFormattingProperty
newValue, Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
instance Property "DisableIndexing" TopicCalculatedFieldProperty where
type PropertyType "DisableIndexing" TopicCalculatedFieldProperty = Value Prelude.Bool
set :: PropertyType "DisableIndexing" TopicCalculatedFieldProperty
-> TopicCalculatedFieldProperty -> TopicCalculatedFieldProperty
set PropertyType "DisableIndexing" TopicCalculatedFieldProperty
newValue TopicCalculatedFieldProperty {Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: TopicCalculatedFieldProperty -> ()
aggregation :: TopicCalculatedFieldProperty -> Maybe (Value Text)
allowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
calculatedFieldDescription :: TopicCalculatedFieldProperty -> Maybe (Value Text)
calculatedFieldName :: TopicCalculatedFieldProperty -> Value Text
calculatedFieldSynonyms :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
cellValueSynonyms :: TopicCalculatedFieldProperty -> Maybe [CellValueSynonymProperty]
columnDataRole :: TopicCalculatedFieldProperty -> Maybe (Value Text)
comparativeOrder :: TopicCalculatedFieldProperty -> Maybe ComparativeOrderProperty
defaultFormatting :: TopicCalculatedFieldProperty -> Maybe DefaultFormattingProperty
disableIndexing :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
expression :: TopicCalculatedFieldProperty -> Value Text
isIncludedInTopic :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
neverAggregateInFilter :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
nonAdditive :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
notAllowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
semanticType :: TopicCalculatedFieldProperty -> Maybe SemanticTypeProperty
timeGranularity :: TopicCalculatedFieldProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
= TopicCalculatedFieldProperty
{disableIndexing :: Maybe (Value Bool)
disableIndexing = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "DisableIndexing" TopicCalculatedFieldProperty
Value Bool
newValue, Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
instance Property "Expression" TopicCalculatedFieldProperty where
type PropertyType "Expression" TopicCalculatedFieldProperty = Value Prelude.Text
set :: PropertyType "Expression" TopicCalculatedFieldProperty
-> TopicCalculatedFieldProperty -> TopicCalculatedFieldProperty
set PropertyType "Expression" TopicCalculatedFieldProperty
newValue TopicCalculatedFieldProperty {Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: TopicCalculatedFieldProperty -> ()
aggregation :: TopicCalculatedFieldProperty -> Maybe (Value Text)
allowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
calculatedFieldDescription :: TopicCalculatedFieldProperty -> Maybe (Value Text)
calculatedFieldName :: TopicCalculatedFieldProperty -> Value Text
calculatedFieldSynonyms :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
cellValueSynonyms :: TopicCalculatedFieldProperty -> Maybe [CellValueSynonymProperty]
columnDataRole :: TopicCalculatedFieldProperty -> Maybe (Value Text)
comparativeOrder :: TopicCalculatedFieldProperty -> Maybe ComparativeOrderProperty
defaultFormatting :: TopicCalculatedFieldProperty -> Maybe DefaultFormattingProperty
disableIndexing :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
expression :: TopicCalculatedFieldProperty -> Value Text
isIncludedInTopic :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
neverAggregateInFilter :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
nonAdditive :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
notAllowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
semanticType :: TopicCalculatedFieldProperty -> Maybe SemanticTypeProperty
timeGranularity :: TopicCalculatedFieldProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
= TopicCalculatedFieldProperty {expression :: Value Text
expression = PropertyType "Expression" TopicCalculatedFieldProperty
Value Text
newValue, Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
instance Property "IsIncludedInTopic" TopicCalculatedFieldProperty where
type PropertyType "IsIncludedInTopic" TopicCalculatedFieldProperty = Value Prelude.Bool
set :: PropertyType "IsIncludedInTopic" TopicCalculatedFieldProperty
-> TopicCalculatedFieldProperty -> TopicCalculatedFieldProperty
set PropertyType "IsIncludedInTopic" TopicCalculatedFieldProperty
newValue TopicCalculatedFieldProperty {Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: TopicCalculatedFieldProperty -> ()
aggregation :: TopicCalculatedFieldProperty -> Maybe (Value Text)
allowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
calculatedFieldDescription :: TopicCalculatedFieldProperty -> Maybe (Value Text)
calculatedFieldName :: TopicCalculatedFieldProperty -> Value Text
calculatedFieldSynonyms :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
cellValueSynonyms :: TopicCalculatedFieldProperty -> Maybe [CellValueSynonymProperty]
columnDataRole :: TopicCalculatedFieldProperty -> Maybe (Value Text)
comparativeOrder :: TopicCalculatedFieldProperty -> Maybe ComparativeOrderProperty
defaultFormatting :: TopicCalculatedFieldProperty -> Maybe DefaultFormattingProperty
disableIndexing :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
expression :: TopicCalculatedFieldProperty -> Value Text
isIncludedInTopic :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
neverAggregateInFilter :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
nonAdditive :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
notAllowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
semanticType :: TopicCalculatedFieldProperty -> Maybe SemanticTypeProperty
timeGranularity :: TopicCalculatedFieldProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
= TopicCalculatedFieldProperty
{isIncludedInTopic :: Maybe (Value Bool)
isIncludedInTopic = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "IsIncludedInTopic" TopicCalculatedFieldProperty
Value Bool
newValue, Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
instance Property "NeverAggregateInFilter" TopicCalculatedFieldProperty where
type PropertyType "NeverAggregateInFilter" TopicCalculatedFieldProperty = Value Prelude.Bool
set :: PropertyType "NeverAggregateInFilter" TopicCalculatedFieldProperty
-> TopicCalculatedFieldProperty -> TopicCalculatedFieldProperty
set PropertyType "NeverAggregateInFilter" TopicCalculatedFieldProperty
newValue TopicCalculatedFieldProperty {Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: TopicCalculatedFieldProperty -> ()
aggregation :: TopicCalculatedFieldProperty -> Maybe (Value Text)
allowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
calculatedFieldDescription :: TopicCalculatedFieldProperty -> Maybe (Value Text)
calculatedFieldName :: TopicCalculatedFieldProperty -> Value Text
calculatedFieldSynonyms :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
cellValueSynonyms :: TopicCalculatedFieldProperty -> Maybe [CellValueSynonymProperty]
columnDataRole :: TopicCalculatedFieldProperty -> Maybe (Value Text)
comparativeOrder :: TopicCalculatedFieldProperty -> Maybe ComparativeOrderProperty
defaultFormatting :: TopicCalculatedFieldProperty -> Maybe DefaultFormattingProperty
disableIndexing :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
expression :: TopicCalculatedFieldProperty -> Value Text
isIncludedInTopic :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
neverAggregateInFilter :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
nonAdditive :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
notAllowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
semanticType :: TopicCalculatedFieldProperty -> Maybe SemanticTypeProperty
timeGranularity :: TopicCalculatedFieldProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
= TopicCalculatedFieldProperty
{neverAggregateInFilter :: Maybe (Value Bool)
neverAggregateInFilter = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "NeverAggregateInFilter" TopicCalculatedFieldProperty
Value Bool
newValue, Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
instance Property "NonAdditive" TopicCalculatedFieldProperty where
type PropertyType "NonAdditive" TopicCalculatedFieldProperty = Value Prelude.Bool
set :: PropertyType "NonAdditive" TopicCalculatedFieldProperty
-> TopicCalculatedFieldProperty -> TopicCalculatedFieldProperty
set PropertyType "NonAdditive" TopicCalculatedFieldProperty
newValue TopicCalculatedFieldProperty {Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: TopicCalculatedFieldProperty -> ()
aggregation :: TopicCalculatedFieldProperty -> Maybe (Value Text)
allowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
calculatedFieldDescription :: TopicCalculatedFieldProperty -> Maybe (Value Text)
calculatedFieldName :: TopicCalculatedFieldProperty -> Value Text
calculatedFieldSynonyms :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
cellValueSynonyms :: TopicCalculatedFieldProperty -> Maybe [CellValueSynonymProperty]
columnDataRole :: TopicCalculatedFieldProperty -> Maybe (Value Text)
comparativeOrder :: TopicCalculatedFieldProperty -> Maybe ComparativeOrderProperty
defaultFormatting :: TopicCalculatedFieldProperty -> Maybe DefaultFormattingProperty
disableIndexing :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
expression :: TopicCalculatedFieldProperty -> Value Text
isIncludedInTopic :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
neverAggregateInFilter :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
nonAdditive :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
notAllowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
semanticType :: TopicCalculatedFieldProperty -> Maybe SemanticTypeProperty
timeGranularity :: TopicCalculatedFieldProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
= TopicCalculatedFieldProperty
{nonAdditive :: Maybe (Value Bool)
nonAdditive = Value Bool -> Maybe (Value Bool)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "NonAdditive" TopicCalculatedFieldProperty
Value Bool
newValue, Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
instance Property "NotAllowedAggregations" TopicCalculatedFieldProperty where
type PropertyType "NotAllowedAggregations" TopicCalculatedFieldProperty = ValueList Prelude.Text
set :: PropertyType "NotAllowedAggregations" TopicCalculatedFieldProperty
-> TopicCalculatedFieldProperty -> TopicCalculatedFieldProperty
set PropertyType "NotAllowedAggregations" TopicCalculatedFieldProperty
newValue TopicCalculatedFieldProperty {Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: TopicCalculatedFieldProperty -> ()
aggregation :: TopicCalculatedFieldProperty -> Maybe (Value Text)
allowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
calculatedFieldDescription :: TopicCalculatedFieldProperty -> Maybe (Value Text)
calculatedFieldName :: TopicCalculatedFieldProperty -> Value Text
calculatedFieldSynonyms :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
cellValueSynonyms :: TopicCalculatedFieldProperty -> Maybe [CellValueSynonymProperty]
columnDataRole :: TopicCalculatedFieldProperty -> Maybe (Value Text)
comparativeOrder :: TopicCalculatedFieldProperty -> Maybe ComparativeOrderProperty
defaultFormatting :: TopicCalculatedFieldProperty -> Maybe DefaultFormattingProperty
disableIndexing :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
expression :: TopicCalculatedFieldProperty -> Value Text
isIncludedInTopic :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
neverAggregateInFilter :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
nonAdditive :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
notAllowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
semanticType :: TopicCalculatedFieldProperty -> Maybe SemanticTypeProperty
timeGranularity :: TopicCalculatedFieldProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
= TopicCalculatedFieldProperty
{notAllowedAggregations :: Maybe (ValueList Text)
notAllowedAggregations = ValueList Text -> Maybe (ValueList Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "NotAllowedAggregations" TopicCalculatedFieldProperty
ValueList Text
newValue, Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
instance Property "SemanticType" TopicCalculatedFieldProperty where
type PropertyType "SemanticType" TopicCalculatedFieldProperty = SemanticTypeProperty
set :: PropertyType "SemanticType" TopicCalculatedFieldProperty
-> TopicCalculatedFieldProperty -> TopicCalculatedFieldProperty
set PropertyType "SemanticType" TopicCalculatedFieldProperty
newValue TopicCalculatedFieldProperty {Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: TopicCalculatedFieldProperty -> ()
aggregation :: TopicCalculatedFieldProperty -> Maybe (Value Text)
allowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
calculatedFieldDescription :: TopicCalculatedFieldProperty -> Maybe (Value Text)
calculatedFieldName :: TopicCalculatedFieldProperty -> Value Text
calculatedFieldSynonyms :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
cellValueSynonyms :: TopicCalculatedFieldProperty -> Maybe [CellValueSynonymProperty]
columnDataRole :: TopicCalculatedFieldProperty -> Maybe (Value Text)
comparativeOrder :: TopicCalculatedFieldProperty -> Maybe ComparativeOrderProperty
defaultFormatting :: TopicCalculatedFieldProperty -> Maybe DefaultFormattingProperty
disableIndexing :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
expression :: TopicCalculatedFieldProperty -> Value Text
isIncludedInTopic :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
neverAggregateInFilter :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
nonAdditive :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
notAllowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
semanticType :: TopicCalculatedFieldProperty -> Maybe SemanticTypeProperty
timeGranularity :: TopicCalculatedFieldProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
= TopicCalculatedFieldProperty
{semanticType :: Maybe SemanticTypeProperty
semanticType = SemanticTypeProperty -> Maybe SemanticTypeProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "SemanticType" TopicCalculatedFieldProperty
SemanticTypeProperty
newValue, Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
()
Value Text
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
timeGranularity :: Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
timeGranularity :: Maybe (Value Text)
..}
instance Property "TimeGranularity" TopicCalculatedFieldProperty where
type PropertyType "TimeGranularity" TopicCalculatedFieldProperty = Value Prelude.Text
set :: PropertyType "TimeGranularity" TopicCalculatedFieldProperty
-> TopicCalculatedFieldProperty -> TopicCalculatedFieldProperty
set PropertyType "TimeGranularity" TopicCalculatedFieldProperty
newValue TopicCalculatedFieldProperty {Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: TopicCalculatedFieldProperty -> ()
aggregation :: TopicCalculatedFieldProperty -> Maybe (Value Text)
allowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
calculatedFieldDescription :: TopicCalculatedFieldProperty -> Maybe (Value Text)
calculatedFieldName :: TopicCalculatedFieldProperty -> Value Text
calculatedFieldSynonyms :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
cellValueSynonyms :: TopicCalculatedFieldProperty -> Maybe [CellValueSynonymProperty]
columnDataRole :: TopicCalculatedFieldProperty -> Maybe (Value Text)
comparativeOrder :: TopicCalculatedFieldProperty -> Maybe ComparativeOrderProperty
defaultFormatting :: TopicCalculatedFieldProperty -> Maybe DefaultFormattingProperty
disableIndexing :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
expression :: TopicCalculatedFieldProperty -> Value Text
isIncludedInTopic :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
neverAggregateInFilter :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
nonAdditive :: TopicCalculatedFieldProperty -> Maybe (Value Bool)
notAllowedAggregations :: TopicCalculatedFieldProperty -> Maybe (ValueList Text)
semanticType :: TopicCalculatedFieldProperty -> Maybe SemanticTypeProperty
timeGranularity :: TopicCalculatedFieldProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
timeGranularity :: Maybe (Value Text)
..}
= TopicCalculatedFieldProperty
{timeGranularity :: Maybe (Value Text)
timeGranularity = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "TimeGranularity" TopicCalculatedFieldProperty
Value Text
newValue, Maybe [CellValueSynonymProperty]
Maybe (ValueList Text)
Maybe (Value Bool)
Maybe (Value Text)
Maybe ComparativeOrderProperty
Maybe DefaultFormattingProperty
Maybe SemanticTypeProperty
()
Value Text
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
haddock_workaround_ :: ()
aggregation :: Maybe (Value Text)
allowedAggregations :: Maybe (ValueList Text)
calculatedFieldDescription :: Maybe (Value Text)
calculatedFieldName :: Value Text
calculatedFieldSynonyms :: Maybe (ValueList Text)
cellValueSynonyms :: Maybe [CellValueSynonymProperty]
columnDataRole :: Maybe (Value Text)
comparativeOrder :: Maybe ComparativeOrderProperty
defaultFormatting :: Maybe DefaultFormattingProperty
disableIndexing :: Maybe (Value Bool)
expression :: Value Text
isIncludedInTopic :: Maybe (Value Bool)
neverAggregateInFilter :: Maybe (Value Bool)
nonAdditive :: Maybe (Value Bool)
notAllowedAggregations :: Maybe (ValueList Text)
semanticType :: Maybe SemanticTypeProperty
..}