module Stratosphere.QuickSight.Analysis.TableSideBorderOptionsProperty (
module Exports, TableSideBorderOptionsProperty(..),
mkTableSideBorderOptionsProperty
) where
import qualified Data.Aeson as JSON
import qualified Stratosphere.Prelude as Prelude
import Stratosphere.Property
import {-# SOURCE #-} Stratosphere.QuickSight.Analysis.TableBorderOptionsProperty as Exports
import Stratosphere.ResourceProperties
data TableSideBorderOptionsProperty
=
TableSideBorderOptionsProperty {TableSideBorderOptionsProperty -> ()
haddock_workaround_ :: (),
TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
bottom :: (Prelude.Maybe TableBorderOptionsProperty),
TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
innerHorizontal :: (Prelude.Maybe TableBorderOptionsProperty),
TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
innerVertical :: (Prelude.Maybe TableBorderOptionsProperty),
TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
left :: (Prelude.Maybe TableBorderOptionsProperty),
TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
right :: (Prelude.Maybe TableBorderOptionsProperty),
TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
top :: (Prelude.Maybe TableBorderOptionsProperty)}
deriving stock (TableSideBorderOptionsProperty
-> TableSideBorderOptionsProperty -> Bool
(TableSideBorderOptionsProperty
-> TableSideBorderOptionsProperty -> Bool)
-> (TableSideBorderOptionsProperty
-> TableSideBorderOptionsProperty -> Bool)
-> Eq TableSideBorderOptionsProperty
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: TableSideBorderOptionsProperty
-> TableSideBorderOptionsProperty -> Bool
== :: TableSideBorderOptionsProperty
-> TableSideBorderOptionsProperty -> Bool
$c/= :: TableSideBorderOptionsProperty
-> TableSideBorderOptionsProperty -> Bool
/= :: TableSideBorderOptionsProperty
-> TableSideBorderOptionsProperty -> Bool
Prelude.Eq, Int -> TableSideBorderOptionsProperty -> ShowS
[TableSideBorderOptionsProperty] -> ShowS
TableSideBorderOptionsProperty -> String
(Int -> TableSideBorderOptionsProperty -> ShowS)
-> (TableSideBorderOptionsProperty -> String)
-> ([TableSideBorderOptionsProperty] -> ShowS)
-> Show TableSideBorderOptionsProperty
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> TableSideBorderOptionsProperty -> ShowS
showsPrec :: Int -> TableSideBorderOptionsProperty -> ShowS
$cshow :: TableSideBorderOptionsProperty -> String
show :: TableSideBorderOptionsProperty -> String
$cshowList :: [TableSideBorderOptionsProperty] -> ShowS
showList :: [TableSideBorderOptionsProperty] -> ShowS
Prelude.Show)
mkTableSideBorderOptionsProperty :: TableSideBorderOptionsProperty
mkTableSideBorderOptionsProperty :: TableSideBorderOptionsProperty
mkTableSideBorderOptionsProperty
= TableSideBorderOptionsProperty
{haddock_workaround_ :: ()
haddock_workaround_ = (), bottom :: Maybe TableBorderOptionsProperty
bottom = Maybe TableBorderOptionsProperty
forall a. Maybe a
Prelude.Nothing,
innerHorizontal :: Maybe TableBorderOptionsProperty
innerHorizontal = Maybe TableBorderOptionsProperty
forall a. Maybe a
Prelude.Nothing, innerVertical :: Maybe TableBorderOptionsProperty
innerVertical = Maybe TableBorderOptionsProperty
forall a. Maybe a
Prelude.Nothing,
left :: Maybe TableBorderOptionsProperty
left = Maybe TableBorderOptionsProperty
forall a. Maybe a
Prelude.Nothing, right :: Maybe TableBorderOptionsProperty
right = Maybe TableBorderOptionsProperty
forall a. Maybe a
Prelude.Nothing,
top :: Maybe TableBorderOptionsProperty
top = Maybe TableBorderOptionsProperty
forall a. Maybe a
Prelude.Nothing}
instance ToResourceProperties TableSideBorderOptionsProperty where
toResourceProperties :: TableSideBorderOptionsProperty -> ResourceProperties
toResourceProperties TableSideBorderOptionsProperty {Maybe TableBorderOptionsProperty
()
haddock_workaround_ :: TableSideBorderOptionsProperty -> ()
bottom :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
innerHorizontal :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
innerVertical :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
left :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
right :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
top :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
haddock_workaround_ :: ()
bottom :: Maybe TableBorderOptionsProperty
innerHorizontal :: Maybe TableBorderOptionsProperty
innerVertical :: Maybe TableBorderOptionsProperty
left :: Maybe TableBorderOptionsProperty
right :: Maybe TableBorderOptionsProperty
top :: Maybe TableBorderOptionsProperty
..}
= ResourceProperties
{awsType :: Text
awsType = Text
"AWS::QuickSight::Analysis.TableSideBorderOptions",
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 -> TableBorderOptionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Bottom" (TableBorderOptionsProperty -> (Key, Value))
-> Maybe TableBorderOptionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe TableBorderOptionsProperty
bottom,
Key -> TableBorderOptionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"InnerHorizontal" (TableBorderOptionsProperty -> (Key, Value))
-> Maybe TableBorderOptionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe TableBorderOptionsProperty
innerHorizontal,
Key -> TableBorderOptionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"InnerVertical" (TableBorderOptionsProperty -> (Key, Value))
-> Maybe TableBorderOptionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe TableBorderOptionsProperty
innerVertical,
Key -> TableBorderOptionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Left" (TableBorderOptionsProperty -> (Key, Value))
-> Maybe TableBorderOptionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe TableBorderOptionsProperty
left,
Key -> TableBorderOptionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Right" (TableBorderOptionsProperty -> (Key, Value))
-> Maybe TableBorderOptionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe TableBorderOptionsProperty
right,
Key -> TableBorderOptionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Top" (TableBorderOptionsProperty -> (Key, Value))
-> Maybe TableBorderOptionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe TableBorderOptionsProperty
top])}
instance JSON.ToJSON TableSideBorderOptionsProperty where
toJSON :: TableSideBorderOptionsProperty -> Value
toJSON TableSideBorderOptionsProperty {Maybe TableBorderOptionsProperty
()
haddock_workaround_ :: TableSideBorderOptionsProperty -> ()
bottom :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
innerHorizontal :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
innerVertical :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
left :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
right :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
top :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
haddock_workaround_ :: ()
bottom :: Maybe TableBorderOptionsProperty
innerHorizontal :: Maybe TableBorderOptionsProperty
innerVertical :: Maybe TableBorderOptionsProperty
left :: Maybe TableBorderOptionsProperty
right :: Maybe TableBorderOptionsProperty
top :: Maybe TableBorderOptionsProperty
..}
= [(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 -> TableBorderOptionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Bottom" (TableBorderOptionsProperty -> (Key, Value))
-> Maybe TableBorderOptionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe TableBorderOptionsProperty
bottom,
Key -> TableBorderOptionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"InnerHorizontal" (TableBorderOptionsProperty -> (Key, Value))
-> Maybe TableBorderOptionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe TableBorderOptionsProperty
innerHorizontal,
Key -> TableBorderOptionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"InnerVertical" (TableBorderOptionsProperty -> (Key, Value))
-> Maybe TableBorderOptionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe TableBorderOptionsProperty
innerVertical,
Key -> TableBorderOptionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Left" (TableBorderOptionsProperty -> (Key, Value))
-> Maybe TableBorderOptionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe TableBorderOptionsProperty
left,
Key -> TableBorderOptionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Right" (TableBorderOptionsProperty -> (Key, Value))
-> Maybe TableBorderOptionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe TableBorderOptionsProperty
right,
Key -> TableBorderOptionsProperty -> (Key, Value)
forall v. ToJSON v => Key -> v -> (Key, Value)
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
(JSON..=) Key
"Top" (TableBorderOptionsProperty -> (Key, Value))
-> Maybe TableBorderOptionsProperty -> Maybe (Key, Value)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe TableBorderOptionsProperty
top]))
instance Property "Bottom" TableSideBorderOptionsProperty where
type PropertyType "Bottom" TableSideBorderOptionsProperty = TableBorderOptionsProperty
set :: PropertyType "Bottom" TableSideBorderOptionsProperty
-> TableSideBorderOptionsProperty -> TableSideBorderOptionsProperty
set PropertyType "Bottom" TableSideBorderOptionsProperty
newValue TableSideBorderOptionsProperty {Maybe TableBorderOptionsProperty
()
haddock_workaround_ :: TableSideBorderOptionsProperty -> ()
bottom :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
innerHorizontal :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
innerVertical :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
left :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
right :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
top :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
haddock_workaround_ :: ()
bottom :: Maybe TableBorderOptionsProperty
innerHorizontal :: Maybe TableBorderOptionsProperty
innerVertical :: Maybe TableBorderOptionsProperty
left :: Maybe TableBorderOptionsProperty
right :: Maybe TableBorderOptionsProperty
top :: Maybe TableBorderOptionsProperty
..}
= TableSideBorderOptionsProperty
{bottom :: Maybe TableBorderOptionsProperty
bottom = TableBorderOptionsProperty -> Maybe TableBorderOptionsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Bottom" TableSideBorderOptionsProperty
TableBorderOptionsProperty
newValue, Maybe TableBorderOptionsProperty
()
haddock_workaround_ :: ()
innerHorizontal :: Maybe TableBorderOptionsProperty
innerVertical :: Maybe TableBorderOptionsProperty
left :: Maybe TableBorderOptionsProperty
right :: Maybe TableBorderOptionsProperty
top :: Maybe TableBorderOptionsProperty
haddock_workaround_ :: ()
innerHorizontal :: Maybe TableBorderOptionsProperty
innerVertical :: Maybe TableBorderOptionsProperty
left :: Maybe TableBorderOptionsProperty
right :: Maybe TableBorderOptionsProperty
top :: Maybe TableBorderOptionsProperty
..}
instance Property "InnerHorizontal" TableSideBorderOptionsProperty where
type PropertyType "InnerHorizontal" TableSideBorderOptionsProperty = TableBorderOptionsProperty
set :: PropertyType "InnerHorizontal" TableSideBorderOptionsProperty
-> TableSideBorderOptionsProperty -> TableSideBorderOptionsProperty
set PropertyType "InnerHorizontal" TableSideBorderOptionsProperty
newValue TableSideBorderOptionsProperty {Maybe TableBorderOptionsProperty
()
haddock_workaround_ :: TableSideBorderOptionsProperty -> ()
bottom :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
innerHorizontal :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
innerVertical :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
left :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
right :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
top :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
haddock_workaround_ :: ()
bottom :: Maybe TableBorderOptionsProperty
innerHorizontal :: Maybe TableBorderOptionsProperty
innerVertical :: Maybe TableBorderOptionsProperty
left :: Maybe TableBorderOptionsProperty
right :: Maybe TableBorderOptionsProperty
top :: Maybe TableBorderOptionsProperty
..}
= TableSideBorderOptionsProperty
{innerHorizontal :: Maybe TableBorderOptionsProperty
innerHorizontal = TableBorderOptionsProperty -> Maybe TableBorderOptionsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "InnerHorizontal" TableSideBorderOptionsProperty
TableBorderOptionsProperty
newValue, Maybe TableBorderOptionsProperty
()
haddock_workaround_ :: ()
bottom :: Maybe TableBorderOptionsProperty
innerVertical :: Maybe TableBorderOptionsProperty
left :: Maybe TableBorderOptionsProperty
right :: Maybe TableBorderOptionsProperty
top :: Maybe TableBorderOptionsProperty
haddock_workaround_ :: ()
bottom :: Maybe TableBorderOptionsProperty
innerVertical :: Maybe TableBorderOptionsProperty
left :: Maybe TableBorderOptionsProperty
right :: Maybe TableBorderOptionsProperty
top :: Maybe TableBorderOptionsProperty
..}
instance Property "InnerVertical" TableSideBorderOptionsProperty where
type PropertyType "InnerVertical" TableSideBorderOptionsProperty = TableBorderOptionsProperty
set :: PropertyType "InnerVertical" TableSideBorderOptionsProperty
-> TableSideBorderOptionsProperty -> TableSideBorderOptionsProperty
set PropertyType "InnerVertical" TableSideBorderOptionsProperty
newValue TableSideBorderOptionsProperty {Maybe TableBorderOptionsProperty
()
haddock_workaround_ :: TableSideBorderOptionsProperty -> ()
bottom :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
innerHorizontal :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
innerVertical :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
left :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
right :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
top :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
haddock_workaround_ :: ()
bottom :: Maybe TableBorderOptionsProperty
innerHorizontal :: Maybe TableBorderOptionsProperty
innerVertical :: Maybe TableBorderOptionsProperty
left :: Maybe TableBorderOptionsProperty
right :: Maybe TableBorderOptionsProperty
top :: Maybe TableBorderOptionsProperty
..}
= TableSideBorderOptionsProperty
{innerVertical :: Maybe TableBorderOptionsProperty
innerVertical = TableBorderOptionsProperty -> Maybe TableBorderOptionsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "InnerVertical" TableSideBorderOptionsProperty
TableBorderOptionsProperty
newValue, Maybe TableBorderOptionsProperty
()
haddock_workaround_ :: ()
bottom :: Maybe TableBorderOptionsProperty
innerHorizontal :: Maybe TableBorderOptionsProperty
left :: Maybe TableBorderOptionsProperty
right :: Maybe TableBorderOptionsProperty
top :: Maybe TableBorderOptionsProperty
haddock_workaround_ :: ()
bottom :: Maybe TableBorderOptionsProperty
innerHorizontal :: Maybe TableBorderOptionsProperty
left :: Maybe TableBorderOptionsProperty
right :: Maybe TableBorderOptionsProperty
top :: Maybe TableBorderOptionsProperty
..}
instance Property "Left" TableSideBorderOptionsProperty where
type PropertyType "Left" TableSideBorderOptionsProperty = TableBorderOptionsProperty
set :: PropertyType "Left" TableSideBorderOptionsProperty
-> TableSideBorderOptionsProperty -> TableSideBorderOptionsProperty
set PropertyType "Left" TableSideBorderOptionsProperty
newValue TableSideBorderOptionsProperty {Maybe TableBorderOptionsProperty
()
haddock_workaround_ :: TableSideBorderOptionsProperty -> ()
bottom :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
innerHorizontal :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
innerVertical :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
left :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
right :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
top :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
haddock_workaround_ :: ()
bottom :: Maybe TableBorderOptionsProperty
innerHorizontal :: Maybe TableBorderOptionsProperty
innerVertical :: Maybe TableBorderOptionsProperty
left :: Maybe TableBorderOptionsProperty
right :: Maybe TableBorderOptionsProperty
top :: Maybe TableBorderOptionsProperty
..}
= TableSideBorderOptionsProperty {left :: Maybe TableBorderOptionsProperty
left = TableBorderOptionsProperty -> Maybe TableBorderOptionsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Left" TableSideBorderOptionsProperty
TableBorderOptionsProperty
newValue, Maybe TableBorderOptionsProperty
()
haddock_workaround_ :: ()
bottom :: Maybe TableBorderOptionsProperty
innerHorizontal :: Maybe TableBorderOptionsProperty
innerVertical :: Maybe TableBorderOptionsProperty
right :: Maybe TableBorderOptionsProperty
top :: Maybe TableBorderOptionsProperty
haddock_workaround_ :: ()
bottom :: Maybe TableBorderOptionsProperty
innerHorizontal :: Maybe TableBorderOptionsProperty
innerVertical :: Maybe TableBorderOptionsProperty
right :: Maybe TableBorderOptionsProperty
top :: Maybe TableBorderOptionsProperty
..}
instance Property "Right" TableSideBorderOptionsProperty where
type PropertyType "Right" TableSideBorderOptionsProperty = TableBorderOptionsProperty
set :: PropertyType "Right" TableSideBorderOptionsProperty
-> TableSideBorderOptionsProperty -> TableSideBorderOptionsProperty
set PropertyType "Right" TableSideBorderOptionsProperty
newValue TableSideBorderOptionsProperty {Maybe TableBorderOptionsProperty
()
haddock_workaround_ :: TableSideBorderOptionsProperty -> ()
bottom :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
innerHorizontal :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
innerVertical :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
left :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
right :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
top :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
haddock_workaround_ :: ()
bottom :: Maybe TableBorderOptionsProperty
innerHorizontal :: Maybe TableBorderOptionsProperty
innerVertical :: Maybe TableBorderOptionsProperty
left :: Maybe TableBorderOptionsProperty
right :: Maybe TableBorderOptionsProperty
top :: Maybe TableBorderOptionsProperty
..}
= TableSideBorderOptionsProperty
{right :: Maybe TableBorderOptionsProperty
right = TableBorderOptionsProperty -> Maybe TableBorderOptionsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Right" TableSideBorderOptionsProperty
TableBorderOptionsProperty
newValue, Maybe TableBorderOptionsProperty
()
haddock_workaround_ :: ()
bottom :: Maybe TableBorderOptionsProperty
innerHorizontal :: Maybe TableBorderOptionsProperty
innerVertical :: Maybe TableBorderOptionsProperty
left :: Maybe TableBorderOptionsProperty
top :: Maybe TableBorderOptionsProperty
haddock_workaround_ :: ()
bottom :: Maybe TableBorderOptionsProperty
innerHorizontal :: Maybe TableBorderOptionsProperty
innerVertical :: Maybe TableBorderOptionsProperty
left :: Maybe TableBorderOptionsProperty
top :: Maybe TableBorderOptionsProperty
..}
instance Property "Top" TableSideBorderOptionsProperty where
type PropertyType "Top" TableSideBorderOptionsProperty = TableBorderOptionsProperty
set :: PropertyType "Top" TableSideBorderOptionsProperty
-> TableSideBorderOptionsProperty -> TableSideBorderOptionsProperty
set PropertyType "Top" TableSideBorderOptionsProperty
newValue TableSideBorderOptionsProperty {Maybe TableBorderOptionsProperty
()
haddock_workaround_ :: TableSideBorderOptionsProperty -> ()
bottom :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
innerHorizontal :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
innerVertical :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
left :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
right :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
top :: TableSideBorderOptionsProperty -> Maybe TableBorderOptionsProperty
haddock_workaround_ :: ()
bottom :: Maybe TableBorderOptionsProperty
innerHorizontal :: Maybe TableBorderOptionsProperty
innerVertical :: Maybe TableBorderOptionsProperty
left :: Maybe TableBorderOptionsProperty
right :: Maybe TableBorderOptionsProperty
top :: Maybe TableBorderOptionsProperty
..}
= TableSideBorderOptionsProperty {top :: Maybe TableBorderOptionsProperty
top = TableBorderOptionsProperty -> Maybe TableBorderOptionsProperty
forall a. a -> Maybe a
forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure PropertyType "Top" TableSideBorderOptionsProperty
TableBorderOptionsProperty
newValue, Maybe TableBorderOptionsProperty
()
haddock_workaround_ :: ()
bottom :: Maybe TableBorderOptionsProperty
innerHorizontal :: Maybe TableBorderOptionsProperty
innerVertical :: Maybe TableBorderOptionsProperty
left :: Maybe TableBorderOptionsProperty
right :: Maybe TableBorderOptionsProperty
haddock_workaround_ :: ()
bottom :: Maybe TableBorderOptionsProperty
innerHorizontal :: Maybe TableBorderOptionsProperty
innerVertical :: Maybe TableBorderOptionsProperty
left :: Maybe TableBorderOptionsProperty
right :: Maybe TableBorderOptionsProperty
..}