module Stratosphere.QuickSight.Theme.UIColorPaletteProperty (
UIColorPaletteProperty(..), mkUIColorPaletteProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import Stratosphere.ResourceProperties
import Stratosphere.Value
data UIColorPaletteProperty
=
UIColorPaletteProperty {UIColorPaletteProperty -> ()
haddock_workaround_ :: (),
UIColorPaletteProperty -> Maybe (Value Text)
accent :: (Prelude.Maybe (Value Prelude.Text)),
UIColorPaletteProperty -> Maybe (Value Text)
accentForeground :: (Prelude.Maybe (Value Prelude.Text)),
UIColorPaletteProperty -> Maybe (Value Text)
danger :: (Prelude.Maybe (Value Prelude.Text)),
UIColorPaletteProperty -> Maybe (Value Text)
dangerForeground :: (Prelude.Maybe (Value Prelude.Text)),
UIColorPaletteProperty -> Maybe (Value Text)
dimension :: (Prelude.Maybe (Value Prelude.Text)),
UIColorPaletteProperty -> Maybe (Value Text)
dimensionForeground :: (Prelude.Maybe (Value Prelude.Text)),
UIColorPaletteProperty -> Maybe (Value Text)
measure :: (Prelude.Maybe (Value Prelude.Text)),
UIColorPaletteProperty -> Maybe (Value Text)
measureForeground :: (Prelude.Maybe (Value Prelude.Text)),
UIColorPaletteProperty -> Maybe (Value Text)
primaryBackground :: (Prelude.Maybe (Value Prelude.Text)),
UIColorPaletteProperty -> Maybe (Value Text)
primaryForeground :: (Prelude.Maybe (Value Prelude.Text)),
UIColorPaletteProperty -> Maybe (Value Text)
secondaryBackground :: (Prelude.Maybe (Value Prelude.Text)),
UIColorPaletteProperty -> Maybe (Value Text)
secondaryForeground :: (Prelude.Maybe (Value Prelude.Text)),
UIColorPaletteProperty -> Maybe (Value Text)
success :: (Prelude.Maybe (Value Prelude.Text)),
UIColorPaletteProperty -> Maybe (Value Text)
successForeground :: (Prelude.Maybe (Value Prelude.Text)),
UIColorPaletteProperty -> Maybe (Value Text)
warning :: (Prelude.Maybe (Value Prelude.Text)),
UIColorPaletteProperty -> Maybe (Value Text)
warningForeground :: (Prelude.Maybe (Value Prelude.Text))}
deriving stock (UIColorPaletteProperty -> UIColorPaletteProperty -> Bool
(UIColorPaletteProperty -> UIColorPaletteProperty -> Bool)
-> (UIColorPaletteProperty -> UIColorPaletteProperty -> Bool)
-> Eq UIColorPaletteProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: UIColorPaletteProperty -> UIColorPaletteProperty -> Bool
== :: UIColorPaletteProperty -> UIColorPaletteProperty -> Bool
$c/= :: UIColorPaletteProperty -> UIColorPaletteProperty -> Bool
/= :: UIColorPaletteProperty -> UIColorPaletteProperty -> Bool
Prelude.Eq, Int -> UIColorPaletteProperty -> ShowS
[UIColorPaletteProperty] -> ShowS
UIColorPaletteProperty -> String
(Int -> UIColorPaletteProperty -> ShowS)
-> (UIColorPaletteProperty -> String)
-> ([UIColorPaletteProperty] -> ShowS)
-> Show UIColorPaletteProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> UIColorPaletteProperty -> ShowS
showsPrec :: Int -> UIColorPaletteProperty -> ShowS
$cshow :: UIColorPaletteProperty -> String
show :: UIColorPaletteProperty -> String
$cshowList :: [UIColorPaletteProperty] -> ShowS
showList :: [UIColorPaletteProperty] -> ShowS
Prelude.Show)
mkUIColorPaletteProperty :: UIColorPaletteProperty
mkUIColorPaletteProperty :: UIColorPaletteProperty
mkUIColorPaletteProperty
= UIColorPaletteProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), accent :: Maybe (Value Text)
accent = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
accentForeground :: Maybe (Value Text)
accentForeground = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, danger :: Maybe (Value Text)
danger = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
dangerForeground :: Maybe (Value Text)
dangerForeground = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, dimension :: Maybe (Value Text)
dimension = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
dimensionForeground :: Maybe (Value Text)
dimensionForeground = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, measure :: Maybe (Value Text)
measure = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
measureForeground :: Maybe (Value Text)
measureForeground = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
primaryBackground :: Maybe (Value Text)
primaryBackground = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
primaryForeground :: Maybe (Value Text)
primaryForeground = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
secondaryBackground :: Maybe (Value Text)
secondaryBackground = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
secondaryForeground :: Maybe (Value Text)
secondaryForeground = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, success :: Maybe (Value Text)
success = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
successForeground :: Maybe (Value Text)
successForeground = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing, warning :: Maybe (Value Text)
warning = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing,
warningForeground :: Maybe (Value Text)
warningForeground = Maybe (Value Text)
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties UIColorPaletteProperty where
toResourceProperties :: UIColorPaletteProperty -> ResourceProperties
toResourceProperties UIColorPaletteProperty {Maybe (Value Text)
()
haddock_workaround_ :: UIColorPaletteProperty -> ()
accent :: UIColorPaletteProperty -> Maybe (Value Text)
accentForeground :: UIColorPaletteProperty -> Maybe (Value Text)
danger :: UIColorPaletteProperty -> Maybe (Value Text)
dangerForeground :: UIColorPaletteProperty -> Maybe (Value Text)
dimension :: UIColorPaletteProperty -> Maybe (Value Text)
dimensionForeground :: UIColorPaletteProperty -> Maybe (Value Text)
measure :: UIColorPaletteProperty -> Maybe (Value Text)
measureForeground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
success :: UIColorPaletteProperty -> Maybe (Value Text)
successForeground :: UIColorPaletteProperty -> Maybe (Value Text)
warning :: UIColorPaletteProperty -> Maybe (Value Text)
warningForeground :: UIColorPaletteProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::QuickSight::Theme.UIColorPalette",
supportsTags :: Bool
supportsTags = Bool
Prelude.False,
properties :: Object
properties = [Item Object] -> Object
forall l. IsList l => [Item l] -> l
Prelude.fromList
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> 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
"Accent" (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)
accent,
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
"AccentForeground" (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)
accentForeground,
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
"Danger" (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)
danger,
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
"DangerForeground" (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)
dangerForeground,
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
"Dimension" (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)
dimension,
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
"DimensionForeground" (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)
dimensionForeground,
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
"Measure" (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)
measure,
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
"MeasureForeground" (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)
measureForeground,
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
"PrimaryBackground" (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)
primaryBackground,
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
"PrimaryForeground" (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)
primaryForeground,
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
"SecondaryBackground" (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)
secondaryBackground,
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
"SecondaryForeground" (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)
secondaryForeground,
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
"Success" (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)
success,
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
"SuccessForeground" (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)
successForeground,
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
"Warning" (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)
warning,
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
"WarningForeground" (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)
warningForeground])}
instance JSON.ToJSON UIColorPaletteProperty where
toJSON :: UIColorPaletteProperty -> Value
toJSON UIColorPaletteProperty {Maybe (Value Text)
()
haddock_workaround_ :: UIColorPaletteProperty -> ()
accent :: UIColorPaletteProperty -> Maybe (Value Text)
accentForeground :: UIColorPaletteProperty -> Maybe (Value Text)
danger :: UIColorPaletteProperty -> Maybe (Value Text)
dangerForeground :: UIColorPaletteProperty -> Maybe (Value Text)
dimension :: UIColorPaletteProperty -> Maybe (Value Text)
dimensionForeground :: UIColorPaletteProperty -> Maybe (Value Text)
measure :: UIColorPaletteProperty -> Maybe (Value Text)
measureForeground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
success :: UIColorPaletteProperty -> Maybe (Value Text)
successForeground :: UIColorPaletteProperty -> Maybe (Value Text)
warning :: UIColorPaletteProperty -> Maybe (Value Text)
warningForeground :: UIColorPaletteProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
= [(Key, Value)] -> Value
JSON.object
([Item [(Key, Value)]] -> [(Key, Value)]
forall l. IsList l => [Item l] -> l
Prelude.fromList
([Maybe (Key, Value)] -> [(Key, Value)]
forall a. [Maybe a] -> [a]
Prelude.catMaybes
[Key -> 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
"Accent" (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)
accent,
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
"AccentForeground" (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)
accentForeground,
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
"Danger" (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)
danger,
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
"DangerForeground" (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)
dangerForeground,
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
"Dimension" (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)
dimension,
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
"DimensionForeground" (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)
dimensionForeground,
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
"Measure" (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)
measure,
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
"MeasureForeground" (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)
measureForeground,
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
"PrimaryBackground" (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)
primaryBackground,
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
"PrimaryForeground" (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)
primaryForeground,
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
"SecondaryBackground" (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)
secondaryBackground,
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
"SecondaryForeground" (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)
secondaryForeground,
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
"Success" (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)
success,
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
"SuccessForeground" (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)
successForeground,
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
"Warning" (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)
warning,
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
"WarningForeground" (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)
warningForeground]))
instance Property "Accent" UIColorPaletteProperty where
type PropertyType "Accent" UIColorPaletteProperty = Value Prelude.Text
set :: PropertyType "Accent" UIColorPaletteProperty
-> UIColorPaletteProperty -> UIColorPaletteProperty
set PropertyType "Accent" UIColorPaletteProperty
newValue UIColorPaletteProperty {Maybe (Value Text)
()
haddock_workaround_ :: UIColorPaletteProperty -> ()
accent :: UIColorPaletteProperty -> Maybe (Value Text)
accentForeground :: UIColorPaletteProperty -> Maybe (Value Text)
danger :: UIColorPaletteProperty -> Maybe (Value Text)
dangerForeground :: UIColorPaletteProperty -> Maybe (Value Text)
dimension :: UIColorPaletteProperty -> Maybe (Value Text)
dimensionForeground :: UIColorPaletteProperty -> Maybe (Value Text)
measure :: UIColorPaletteProperty -> Maybe (Value Text)
measureForeground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
success :: UIColorPaletteProperty -> Maybe (Value Text)
successForeground :: UIColorPaletteProperty -> Maybe (Value Text)
warning :: UIColorPaletteProperty -> Maybe (Value Text)
warningForeground :: UIColorPaletteProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
= UIColorPaletteProperty {accent :: Maybe (Value Text)
accent = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Accent" UIColorPaletteProperty
Value Text
newValue, Maybe (Value Text)
()
haddock_workaround_ :: ()
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
haddock_workaround_ :: ()
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
instance Property "AccentForeground" UIColorPaletteProperty where
type PropertyType "AccentForeground" UIColorPaletteProperty = Value Prelude.Text
set :: PropertyType "AccentForeground" UIColorPaletteProperty
-> UIColorPaletteProperty -> UIColorPaletteProperty
set PropertyType "AccentForeground" UIColorPaletteProperty
newValue UIColorPaletteProperty {Maybe (Value Text)
()
haddock_workaround_ :: UIColorPaletteProperty -> ()
accent :: UIColorPaletteProperty -> Maybe (Value Text)
accentForeground :: UIColorPaletteProperty -> Maybe (Value Text)
danger :: UIColorPaletteProperty -> Maybe (Value Text)
dangerForeground :: UIColorPaletteProperty -> Maybe (Value Text)
dimension :: UIColorPaletteProperty -> Maybe (Value Text)
dimensionForeground :: UIColorPaletteProperty -> Maybe (Value Text)
measure :: UIColorPaletteProperty -> Maybe (Value Text)
measureForeground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
success :: UIColorPaletteProperty -> Maybe (Value Text)
successForeground :: UIColorPaletteProperty -> Maybe (Value Text)
warning :: UIColorPaletteProperty -> Maybe (Value Text)
warningForeground :: UIColorPaletteProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
= UIColorPaletteProperty
{accentForeground :: Maybe (Value Text)
accentForeground = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "AccentForeground" UIColorPaletteProperty
Value Text
newValue, Maybe (Value Text)
()
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
instance Property "Danger" UIColorPaletteProperty where
type PropertyType "Danger" UIColorPaletteProperty = Value Prelude.Text
set :: PropertyType "Danger" UIColorPaletteProperty
-> UIColorPaletteProperty -> UIColorPaletteProperty
set PropertyType "Danger" UIColorPaletteProperty
newValue UIColorPaletteProperty {Maybe (Value Text)
()
haddock_workaround_ :: UIColorPaletteProperty -> ()
accent :: UIColorPaletteProperty -> Maybe (Value Text)
accentForeground :: UIColorPaletteProperty -> Maybe (Value Text)
danger :: UIColorPaletteProperty -> Maybe (Value Text)
dangerForeground :: UIColorPaletteProperty -> Maybe (Value Text)
dimension :: UIColorPaletteProperty -> Maybe (Value Text)
dimensionForeground :: UIColorPaletteProperty -> Maybe (Value Text)
measure :: UIColorPaletteProperty -> Maybe (Value Text)
measureForeground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
success :: UIColorPaletteProperty -> Maybe (Value Text)
successForeground :: UIColorPaletteProperty -> Maybe (Value Text)
warning :: UIColorPaletteProperty -> Maybe (Value Text)
warningForeground :: UIColorPaletteProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
= UIColorPaletteProperty {danger :: Maybe (Value Text)
danger = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Danger" UIColorPaletteProperty
Value Text
newValue, Maybe (Value Text)
()
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
instance Property "DangerForeground" UIColorPaletteProperty where
type PropertyType "DangerForeground" UIColorPaletteProperty = Value Prelude.Text
set :: PropertyType "DangerForeground" UIColorPaletteProperty
-> UIColorPaletteProperty -> UIColorPaletteProperty
set PropertyType "DangerForeground" UIColorPaletteProperty
newValue UIColorPaletteProperty {Maybe (Value Text)
()
haddock_workaround_ :: UIColorPaletteProperty -> ()
accent :: UIColorPaletteProperty -> Maybe (Value Text)
accentForeground :: UIColorPaletteProperty -> Maybe (Value Text)
danger :: UIColorPaletteProperty -> Maybe (Value Text)
dangerForeground :: UIColorPaletteProperty -> Maybe (Value Text)
dimension :: UIColorPaletteProperty -> Maybe (Value Text)
dimensionForeground :: UIColorPaletteProperty -> Maybe (Value Text)
measure :: UIColorPaletteProperty -> Maybe (Value Text)
measureForeground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
success :: UIColorPaletteProperty -> Maybe (Value Text)
successForeground :: UIColorPaletteProperty -> Maybe (Value Text)
warning :: UIColorPaletteProperty -> Maybe (Value Text)
warningForeground :: UIColorPaletteProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
= UIColorPaletteProperty
{dangerForeground :: Maybe (Value Text)
dangerForeground = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "DangerForeground" UIColorPaletteProperty
Value Text
newValue, Maybe (Value Text)
()
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
instance Property "Dimension" UIColorPaletteProperty where
type PropertyType "Dimension" UIColorPaletteProperty = Value Prelude.Text
set :: PropertyType "Dimension" UIColorPaletteProperty
-> UIColorPaletteProperty -> UIColorPaletteProperty
set PropertyType "Dimension" UIColorPaletteProperty
newValue UIColorPaletteProperty {Maybe (Value Text)
()
haddock_workaround_ :: UIColorPaletteProperty -> ()
accent :: UIColorPaletteProperty -> Maybe (Value Text)
accentForeground :: UIColorPaletteProperty -> Maybe (Value Text)
danger :: UIColorPaletteProperty -> Maybe (Value Text)
dangerForeground :: UIColorPaletteProperty -> Maybe (Value Text)
dimension :: UIColorPaletteProperty -> Maybe (Value Text)
dimensionForeground :: UIColorPaletteProperty -> Maybe (Value Text)
measure :: UIColorPaletteProperty -> Maybe (Value Text)
measureForeground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
success :: UIColorPaletteProperty -> Maybe (Value Text)
successForeground :: UIColorPaletteProperty -> Maybe (Value Text)
warning :: UIColorPaletteProperty -> Maybe (Value Text)
warningForeground :: UIColorPaletteProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
= UIColorPaletteProperty {dimension :: Maybe (Value Text)
dimension = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Dimension" UIColorPaletteProperty
Value Text
newValue, Maybe (Value Text)
()
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
instance Property "DimensionForeground" UIColorPaletteProperty where
type PropertyType "DimensionForeground" UIColorPaletteProperty = Value Prelude.Text
set :: PropertyType "DimensionForeground" UIColorPaletteProperty
-> UIColorPaletteProperty -> UIColorPaletteProperty
set PropertyType "DimensionForeground" UIColorPaletteProperty
newValue UIColorPaletteProperty {Maybe (Value Text)
()
haddock_workaround_ :: UIColorPaletteProperty -> ()
accent :: UIColorPaletteProperty -> Maybe (Value Text)
accentForeground :: UIColorPaletteProperty -> Maybe (Value Text)
danger :: UIColorPaletteProperty -> Maybe (Value Text)
dangerForeground :: UIColorPaletteProperty -> Maybe (Value Text)
dimension :: UIColorPaletteProperty -> Maybe (Value Text)
dimensionForeground :: UIColorPaletteProperty -> Maybe (Value Text)
measure :: UIColorPaletteProperty -> Maybe (Value Text)
measureForeground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
success :: UIColorPaletteProperty -> Maybe (Value Text)
successForeground :: UIColorPaletteProperty -> Maybe (Value Text)
warning :: UIColorPaletteProperty -> Maybe (Value Text)
warningForeground :: UIColorPaletteProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
= UIColorPaletteProperty
{dimensionForeground :: Maybe (Value Text)
dimensionForeground = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "DimensionForeground" UIColorPaletteProperty
Value Text
newValue, Maybe (Value Text)
()
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
instance Property "Measure" UIColorPaletteProperty where
type PropertyType "Measure" UIColorPaletteProperty = Value Prelude.Text
set :: PropertyType "Measure" UIColorPaletteProperty
-> UIColorPaletteProperty -> UIColorPaletteProperty
set PropertyType "Measure" UIColorPaletteProperty
newValue UIColorPaletteProperty {Maybe (Value Text)
()
haddock_workaround_ :: UIColorPaletteProperty -> ()
accent :: UIColorPaletteProperty -> Maybe (Value Text)
accentForeground :: UIColorPaletteProperty -> Maybe (Value Text)
danger :: UIColorPaletteProperty -> Maybe (Value Text)
dangerForeground :: UIColorPaletteProperty -> Maybe (Value Text)
dimension :: UIColorPaletteProperty -> Maybe (Value Text)
dimensionForeground :: UIColorPaletteProperty -> Maybe (Value Text)
measure :: UIColorPaletteProperty -> Maybe (Value Text)
measureForeground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
success :: UIColorPaletteProperty -> Maybe (Value Text)
successForeground :: UIColorPaletteProperty -> Maybe (Value Text)
warning :: UIColorPaletteProperty -> Maybe (Value Text)
warningForeground :: UIColorPaletteProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
= UIColorPaletteProperty {measure :: Maybe (Value Text)
measure = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Measure" UIColorPaletteProperty
Value Text
newValue, Maybe (Value Text)
()
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
instance Property "MeasureForeground" UIColorPaletteProperty where
type PropertyType "MeasureForeground" UIColorPaletteProperty = Value Prelude.Text
set :: PropertyType "MeasureForeground" UIColorPaletteProperty
-> UIColorPaletteProperty -> UIColorPaletteProperty
set PropertyType "MeasureForeground" UIColorPaletteProperty
newValue UIColorPaletteProperty {Maybe (Value Text)
()
haddock_workaround_ :: UIColorPaletteProperty -> ()
accent :: UIColorPaletteProperty -> Maybe (Value Text)
accentForeground :: UIColorPaletteProperty -> Maybe (Value Text)
danger :: UIColorPaletteProperty -> Maybe (Value Text)
dangerForeground :: UIColorPaletteProperty -> Maybe (Value Text)
dimension :: UIColorPaletteProperty -> Maybe (Value Text)
dimensionForeground :: UIColorPaletteProperty -> Maybe (Value Text)
measure :: UIColorPaletteProperty -> Maybe (Value Text)
measureForeground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
success :: UIColorPaletteProperty -> Maybe (Value Text)
successForeground :: UIColorPaletteProperty -> Maybe (Value Text)
warning :: UIColorPaletteProperty -> Maybe (Value Text)
warningForeground :: UIColorPaletteProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
= UIColorPaletteProperty
{measureForeground :: Maybe (Value Text)
measureForeground = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "MeasureForeground" UIColorPaletteProperty
Value Text
newValue, Maybe (Value Text)
()
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
instance Property "PrimaryBackground" UIColorPaletteProperty where
type PropertyType "PrimaryBackground" UIColorPaletteProperty = Value Prelude.Text
set :: PropertyType "PrimaryBackground" UIColorPaletteProperty
-> UIColorPaletteProperty -> UIColorPaletteProperty
set PropertyType "PrimaryBackground" UIColorPaletteProperty
newValue UIColorPaletteProperty {Maybe (Value Text)
()
haddock_workaround_ :: UIColorPaletteProperty -> ()
accent :: UIColorPaletteProperty -> Maybe (Value Text)
accentForeground :: UIColorPaletteProperty -> Maybe (Value Text)
danger :: UIColorPaletteProperty -> Maybe (Value Text)
dangerForeground :: UIColorPaletteProperty -> Maybe (Value Text)
dimension :: UIColorPaletteProperty -> Maybe (Value Text)
dimensionForeground :: UIColorPaletteProperty -> Maybe (Value Text)
measure :: UIColorPaletteProperty -> Maybe (Value Text)
measureForeground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
success :: UIColorPaletteProperty -> Maybe (Value Text)
successForeground :: UIColorPaletteProperty -> Maybe (Value Text)
warning :: UIColorPaletteProperty -> Maybe (Value Text)
warningForeground :: UIColorPaletteProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
= UIColorPaletteProperty
{primaryBackground :: Maybe (Value Text)
primaryBackground = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "PrimaryBackground" UIColorPaletteProperty
Value Text
newValue, Maybe (Value Text)
()
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
instance Property "PrimaryForeground" UIColorPaletteProperty where
type PropertyType "PrimaryForeground" UIColorPaletteProperty = Value Prelude.Text
set :: PropertyType "PrimaryForeground" UIColorPaletteProperty
-> UIColorPaletteProperty -> UIColorPaletteProperty
set PropertyType "PrimaryForeground" UIColorPaletteProperty
newValue UIColorPaletteProperty {Maybe (Value Text)
()
haddock_workaround_ :: UIColorPaletteProperty -> ()
accent :: UIColorPaletteProperty -> Maybe (Value Text)
accentForeground :: UIColorPaletteProperty -> Maybe (Value Text)
danger :: UIColorPaletteProperty -> Maybe (Value Text)
dangerForeground :: UIColorPaletteProperty -> Maybe (Value Text)
dimension :: UIColorPaletteProperty -> Maybe (Value Text)
dimensionForeground :: UIColorPaletteProperty -> Maybe (Value Text)
measure :: UIColorPaletteProperty -> Maybe (Value Text)
measureForeground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
success :: UIColorPaletteProperty -> Maybe (Value Text)
successForeground :: UIColorPaletteProperty -> Maybe (Value Text)
warning :: UIColorPaletteProperty -> Maybe (Value Text)
warningForeground :: UIColorPaletteProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
= UIColorPaletteProperty
{primaryForeground :: Maybe (Value Text)
primaryForeground = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "PrimaryForeground" UIColorPaletteProperty
Value Text
newValue, Maybe (Value Text)
()
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
instance Property "SecondaryBackground" UIColorPaletteProperty where
type PropertyType "SecondaryBackground" UIColorPaletteProperty = Value Prelude.Text
set :: PropertyType "SecondaryBackground" UIColorPaletteProperty
-> UIColorPaletteProperty -> UIColorPaletteProperty
set PropertyType "SecondaryBackground" UIColorPaletteProperty
newValue UIColorPaletteProperty {Maybe (Value Text)
()
haddock_workaround_ :: UIColorPaletteProperty -> ()
accent :: UIColorPaletteProperty -> Maybe (Value Text)
accentForeground :: UIColorPaletteProperty -> Maybe (Value Text)
danger :: UIColorPaletteProperty -> Maybe (Value Text)
dangerForeground :: UIColorPaletteProperty -> Maybe (Value Text)
dimension :: UIColorPaletteProperty -> Maybe (Value Text)
dimensionForeground :: UIColorPaletteProperty -> Maybe (Value Text)
measure :: UIColorPaletteProperty -> Maybe (Value Text)
measureForeground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
success :: UIColorPaletteProperty -> Maybe (Value Text)
successForeground :: UIColorPaletteProperty -> Maybe (Value Text)
warning :: UIColorPaletteProperty -> Maybe (Value Text)
warningForeground :: UIColorPaletteProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
= UIColorPaletteProperty
{secondaryBackground :: Maybe (Value Text)
secondaryBackground = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "SecondaryBackground" UIColorPaletteProperty
Value Text
newValue, Maybe (Value Text)
()
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
instance Property "SecondaryForeground" UIColorPaletteProperty where
type PropertyType "SecondaryForeground" UIColorPaletteProperty = Value Prelude.Text
set :: PropertyType "SecondaryForeground" UIColorPaletteProperty
-> UIColorPaletteProperty -> UIColorPaletteProperty
set PropertyType "SecondaryForeground" UIColorPaletteProperty
newValue UIColorPaletteProperty {Maybe (Value Text)
()
haddock_workaround_ :: UIColorPaletteProperty -> ()
accent :: UIColorPaletteProperty -> Maybe (Value Text)
accentForeground :: UIColorPaletteProperty -> Maybe (Value Text)
danger :: UIColorPaletteProperty -> Maybe (Value Text)
dangerForeground :: UIColorPaletteProperty -> Maybe (Value Text)
dimension :: UIColorPaletteProperty -> Maybe (Value Text)
dimensionForeground :: UIColorPaletteProperty -> Maybe (Value Text)
measure :: UIColorPaletteProperty -> Maybe (Value Text)
measureForeground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
success :: UIColorPaletteProperty -> Maybe (Value Text)
successForeground :: UIColorPaletteProperty -> Maybe (Value Text)
warning :: UIColorPaletteProperty -> Maybe (Value Text)
warningForeground :: UIColorPaletteProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
= UIColorPaletteProperty
{secondaryForeground :: Maybe (Value Text)
secondaryForeground = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "SecondaryForeground" UIColorPaletteProperty
Value Text
newValue, Maybe (Value Text)
()
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
instance Property "Success" UIColorPaletteProperty where
type PropertyType "Success" UIColorPaletteProperty = Value Prelude.Text
set :: PropertyType "Success" UIColorPaletteProperty
-> UIColorPaletteProperty -> UIColorPaletteProperty
set PropertyType "Success" UIColorPaletteProperty
newValue UIColorPaletteProperty {Maybe (Value Text)
()
haddock_workaround_ :: UIColorPaletteProperty -> ()
accent :: UIColorPaletteProperty -> Maybe (Value Text)
accentForeground :: UIColorPaletteProperty -> Maybe (Value Text)
danger :: UIColorPaletteProperty -> Maybe (Value Text)
dangerForeground :: UIColorPaletteProperty -> Maybe (Value Text)
dimension :: UIColorPaletteProperty -> Maybe (Value Text)
dimensionForeground :: UIColorPaletteProperty -> Maybe (Value Text)
measure :: UIColorPaletteProperty -> Maybe (Value Text)
measureForeground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
success :: UIColorPaletteProperty -> Maybe (Value Text)
successForeground :: UIColorPaletteProperty -> Maybe (Value Text)
warning :: UIColorPaletteProperty -> Maybe (Value Text)
warningForeground :: UIColorPaletteProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
= UIColorPaletteProperty {success :: Maybe (Value Text)
success = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Success" UIColorPaletteProperty
Value Text
newValue, Maybe (Value Text)
()
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
instance Property "SuccessForeground" UIColorPaletteProperty where
type PropertyType "SuccessForeground" UIColorPaletteProperty = Value Prelude.Text
set :: PropertyType "SuccessForeground" UIColorPaletteProperty
-> UIColorPaletteProperty -> UIColorPaletteProperty
set PropertyType "SuccessForeground" UIColorPaletteProperty
newValue UIColorPaletteProperty {Maybe (Value Text)
()
haddock_workaround_ :: UIColorPaletteProperty -> ()
accent :: UIColorPaletteProperty -> Maybe (Value Text)
accentForeground :: UIColorPaletteProperty -> Maybe (Value Text)
danger :: UIColorPaletteProperty -> Maybe (Value Text)
dangerForeground :: UIColorPaletteProperty -> Maybe (Value Text)
dimension :: UIColorPaletteProperty -> Maybe (Value Text)
dimensionForeground :: UIColorPaletteProperty -> Maybe (Value Text)
measure :: UIColorPaletteProperty -> Maybe (Value Text)
measureForeground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
success :: UIColorPaletteProperty -> Maybe (Value Text)
successForeground :: UIColorPaletteProperty -> Maybe (Value Text)
warning :: UIColorPaletteProperty -> Maybe (Value Text)
warningForeground :: UIColorPaletteProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
= UIColorPaletteProperty
{successForeground :: Maybe (Value Text)
successForeground = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "SuccessForeground" UIColorPaletteProperty
Value Text
newValue, Maybe (Value Text)
()
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
instance Property "Warning" UIColorPaletteProperty where
type PropertyType "Warning" UIColorPaletteProperty = Value Prelude.Text
set :: PropertyType "Warning" UIColorPaletteProperty
-> UIColorPaletteProperty -> UIColorPaletteProperty
set PropertyType "Warning" UIColorPaletteProperty
newValue UIColorPaletteProperty {Maybe (Value Text)
()
haddock_workaround_ :: UIColorPaletteProperty -> ()
accent :: UIColorPaletteProperty -> Maybe (Value Text)
accentForeground :: UIColorPaletteProperty -> Maybe (Value Text)
danger :: UIColorPaletteProperty -> Maybe (Value Text)
dangerForeground :: UIColorPaletteProperty -> Maybe (Value Text)
dimension :: UIColorPaletteProperty -> Maybe (Value Text)
dimensionForeground :: UIColorPaletteProperty -> Maybe (Value Text)
measure :: UIColorPaletteProperty -> Maybe (Value Text)
measureForeground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
success :: UIColorPaletteProperty -> Maybe (Value Text)
successForeground :: UIColorPaletteProperty -> Maybe (Value Text)
warning :: UIColorPaletteProperty -> Maybe (Value Text)
warningForeground :: UIColorPaletteProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
= UIColorPaletteProperty {warning :: Maybe (Value Text)
warning = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Warning" UIColorPaletteProperty
Value Text
newValue, Maybe (Value Text)
()
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
instance Property "WarningForeground" UIColorPaletteProperty where
type PropertyType "WarningForeground" UIColorPaletteProperty = Value Prelude.Text
set :: PropertyType "WarningForeground" UIColorPaletteProperty
-> UIColorPaletteProperty -> UIColorPaletteProperty
set PropertyType "WarningForeground" UIColorPaletteProperty
newValue UIColorPaletteProperty {Maybe (Value Text)
()
haddock_workaround_ :: UIColorPaletteProperty -> ()
accent :: UIColorPaletteProperty -> Maybe (Value Text)
accentForeground :: UIColorPaletteProperty -> Maybe (Value Text)
danger :: UIColorPaletteProperty -> Maybe (Value Text)
dangerForeground :: UIColorPaletteProperty -> Maybe (Value Text)
dimension :: UIColorPaletteProperty -> Maybe (Value Text)
dimensionForeground :: UIColorPaletteProperty -> Maybe (Value Text)
measure :: UIColorPaletteProperty -> Maybe (Value Text)
measureForeground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
primaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryBackground :: UIColorPaletteProperty -> Maybe (Value Text)
secondaryForeground :: UIColorPaletteProperty -> Maybe (Value Text)
success :: UIColorPaletteProperty -> Maybe (Value Text)
successForeground :: UIColorPaletteProperty -> Maybe (Value Text)
warning :: UIColorPaletteProperty -> Maybe (Value Text)
warningForeground :: UIColorPaletteProperty -> Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
warningForeground :: Maybe (Value Text)
..}
= UIColorPaletteProperty
{warningForeground :: Maybe (Value Text)
warningForeground = Value Text -> Maybe (Value Text)
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "WarningForeground" UIColorPaletteProperty
Value Text
newValue, Maybe (Value Text)
()
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
haddock_workaround_ :: ()
accent :: Maybe (Value Text)
accentForeground :: Maybe (Value Text)
danger :: Maybe (Value Text)
dangerForeground :: Maybe (Value Text)
dimension :: Maybe (Value Text)
dimensionForeground :: Maybe (Value Text)
measure :: Maybe (Value Text)
measureForeground :: Maybe (Value Text)
primaryBackground :: Maybe (Value Text)
primaryForeground :: Maybe (Value Text)
secondaryBackground :: Maybe (Value Text)
secondaryForeground :: Maybe (Value Text)
success :: Maybe (Value Text)
successForeground :: Maybe (Value Text)
warning :: Maybe (Value Text)
..}