-----------------------------------------------------------------------------
{-# LANGUAGE OverloadedStrings #-}
-----------------------------------------------------------------------------
-- |
-- Module      :  Miso.Style
-- Copyright   :  (C) 2016-2025 David M. Johnson
-- License     :  BSD3-style (see the file LICENSE)
-- Maintainer  :  David M. Johnson <code@dmj.io>
-- Stability   :  experimental
-- Portability :  non-portable
-----------------------------------------------------------------------------
module Miso.Style
  ( -- *** Types
    Style
  , Styles
  , StyleSheet
    -- *** Smart Constructor
  , style_
  , styleInline_
  , sheet_
  , (=:)
    -- *** Render
  , renderStyleSheet
    -- *** Combinators
  , alignContent
  , alignItems
  , alignSelf
  , animationDelay
  , animationDirection
  , animationDuration
  , animationFillMode
  , animationIterationCount
  , animation
  , animationName
  , animationPlayState
  , animationTimingFunction
  , aspectRatio
  , backgroundClip
  , backgroundColor
  , backgroundImage
  , background
  , backgroundOrigin
  , backgroundPosition
  , backgroundRepeat
  , backgroundSize
  , borderBottomColor
  , borderBottomLeftRadius
  , borderBottom
  , borderBottomRightRadius
  , borderBottomStyle
  , borderBottomWidth
  , borderColor
  , borderEndEndRadius
  , borderEndStartRadius
  , borderInlineEndColor
  , borderInlineEndStyle
  , borderInlineEndWidth
  , borderInlineStartColor
  , borderInlineStartStyle
  , borderInlineStartWidth
  , borderLeftColor
  , borderLeft
  , borderLeftStyle
  , borderLeftWidth
  , border
  , borderRadius
  , borderRightColor
  , borderRight
  , borderRightStyle
  , borderRightWidth
  , borderStartEndRadius
  , borderStartStartRadius
  , borderStyle
  , borderTopColor
  , borderTopLeftRadius
  , borderTop
  , borderTopRightRadius
  , borderTopStyle
  , borderTopWidth
  , borderWidth
  , bottom
  , boxShadow
  , boxSizing
  , clipPath
  , color
  , columnGap
  , cssVariable
  , direction
  , display
  , filter
  , flexBasis
  , flexDirection
  , flexFlow
  , flexGrow
  , flex
  , flexShrink
  , flexWrap
  , fontFamily
  , fontSize
  , fontStyle
  , fontWeight
  , gap
  , gridAutoColumns
  , gridAutoFlow
  , gridAutoRows
  , gridColumnEnd
  , gridColumnSpan
  , gridColumnStart
  , gridRowEnd
  , gridRowSpan
  , gridRowStart
  , gridTemplateColumns
  , gridTemplateRows
  , height
  , imageRendering
  , insetInlineEnd
  , insetInlineStart
  , justifyContent
  , justifyItems
  , justifySelf
  , left
  , letterSpacing
  , linearCrossGravity
  , linearDirection
  , linearGravity
  , linearLayoutGravity
  , linearWeight
  , linearWeightSum
  , lineHeight
  , marginBottom
  , marginInlineEnd
  , marginInlineStart
  , marginLeft
  , margin
  , marginRight
  , marginTop
  , maskImage
  , mask
  , maxHeight
  , maxWidth
  , minHeight
  , minWidth
  , opacity
  , order
  , overflow
  , overflowX
  , overflowY
  , paddingBottom
  , paddingInlineEnd
  , paddingInlineStart
  , paddingLeft
  , padding
  , paddingRight
  , paddingTop
  , perspective
  , position
  , relativeAlignBottom
  , relativeAlignInlineEnd
  , relativeAlignInlineStart
  , relativeAlignLeft
  , relativeAlignRight
  , relativeAlignTop
  , relativeBottomOf
  , relativeCenter
  , relativeId
  , relativeInlineEndOf
  , relativeInlineStartOf
  , relativeLayoutOnce
  , relativeLeftOf
  , relativeRightOf
  , relativeTopOf
  , right
  , rowGap
  , textAlign
  , textDecoration
  , textIndent
  , textOverflow
  , textShadow
  , textStrokeColor
  , textStroke
  , textStrokeWidth
  , top
  , transform
  , transformOrigin
  , transitionDelay
  , transitionDuration
  , transition
  , transitionProperty
  , transitionTimingFunction
  , verticalAlign
  , visibility
  , whiteSpace
  , width
  , wordBreak
  , xAutoFontSize
  , xAutoFontSizePresetSizes
  , xHandleColor
  , xHandleSize
  , zIndex
  -- *** Colors
  , module Miso.Style.Color
  ) where
-----------------------------------------------------------------------------
import           Data.Map (Map)
import qualified Data.Map as M
import           Miso.String (MisoString)
import qualified Miso.String as MS
import           Miso.Style.Color
import           Miso.Property
import           Miso.Types (Attribute)
import qualified Miso.Types as MT
-----------------------------------------------------------------------------
import           Prelude hiding (filter)
-----------------------------------------------------------------------------
-- | Smart constructor for Attributes. This function is helpful when 
-- constructing 'Style'.
--
-- Example shown below.
--
-- @
-- div_ [ style_  [ "background" =: "red" ] ] []
-- @
--
(=:) :: k -> v -> (k, v)
k
k =: :: forall k v. k -> v -> (k, v)
=: v
v = (k
k,v
v)
-----------------------------------------------------------------------------
-----------------------------------------------------------------------------
-- | 'Style'
--
-- Type for a CSS 'Style'
--
type Style = (MisoString, MisoString)
-----------------------------------------------------------------------------
-- | 'Styles'
--
-- Type for a @Map@ of CSS 'Style'. Used with @StyleSheet@.
--
type Styles = Map MisoString MisoString
-----------------------------------------------------------------------------
-- | 'StyleSheet'
--
-- Type for a CSS style on native
--
newtype StyleSheet = StyleSheet { StyleSheet -> Map Text Styles
getStyleSheet :: Map MisoString Styles }
-----------------------------------------------------------------------------
sheet_ :: [(MisoString, Styles)] -> StyleSheet
sheet_ :: [(Text, Styles)] -> StyleSheet
sheet_ = Map Text Styles -> StyleSheet
StyleSheet (Map Text Styles -> StyleSheet)
-> ([(Text, Styles)] -> Map Text Styles)
-> [(Text, Styles)]
-> StyleSheet
forall b c a. (b -> c) -> (a -> b) -> a -> c
. [(Text, Styles)] -> Map Text Styles
forall k a. Ord k => [(k, a)] -> Map k a
M.fromList
-----------------------------------------------------------------------------
-- | @style_@ is an attribute that will set the @style@
-- attribute of the associated DOM node to @attrs@.
--
-- @style@ attributes not contained in @attrs@ will be deleted.
--
-- > import qualified Data.Map as M
-- > div_ [ style_ [ backgroundColor "red" ] [ ]
--
-- <https://developer.mozilla.org/en-US/docs/Web/CSS>
--
style_ :: [Style] -> Attribute action
style_ :: forall action. [Style] -> Attribute action
style_ = Styles -> Attribute action
forall action. Styles -> Attribute action
MT.Styles (Styles -> Attribute action)
-> ([Style] -> Styles) -> [Style] -> Attribute action
forall b c a. (b -> c) -> (a -> b) -> a -> c
. [Style] -> Styles
forall k a. Ord k => [(k, a)] -> Map k a
M.fromList
-----------------------------------------------------------------------------
-- | Set "style" property
--
-- > view m = div_ [ styleInline_ "background-color:red;color:blue;" ] [ "foo" ]
--
-- https://developer.mozilla.org/en-US/docs/Web/CSS
styleInline_ ::  MisoString -> Attribute action
styleInline_ :: forall action. Text -> Attribute action
styleInline_ = Text -> Text -> Attribute action
forall action. Text -> Text -> Attribute action
textProp Text
"style"
-----------------------------------------------------------------------------
-- | 'renderStyleSheet'
--
-- Renders a 'StyleSheet' to a 'MisoString'
--
-- @
-- testSheet :: StyleSheet
-- testSheet =
--   sheet_
--   [ ".name" =:
--       style_
--       [ backgroundColor "red"
--       , alignContent "top"
--       ]
--   , "#container" =:
--       style_
--       [ backgroundColor "blue"
--       , alignContent "center"
--       ]
--   ]
-- @
--
renderStyles :: Styles -> MisoString
renderStyles :: Styles -> Text
renderStyles Styles
m = [Text] -> Text
MS.unlines
  [ [Text] -> Text
forall a. Monoid a => [a] -> a
mconcat [ Text
spaced, Text
k, Text
":", Text
v, Text
";" ]
  | (Text
k,Text
v) <- Styles -> [Style]
forall k a. Map k a -> [(k, a)]
M.toList Styles
m
  , let spaced :: Text
spaced = Text
"  "
  ]
-----------------------------------------------------------------------------  
renderStyleSheet :: StyleSheet -> MisoString
renderStyleSheet :: StyleSheet -> Text
renderStyleSheet StyleSheet
styleSheet = [Text] -> Text
forall a. Monoid a => [a] -> a
mconcat
  [ [Text] -> Text
MS.unlines
    [ Text
selector
    , Text
"{"
    , Styles -> Text
renderStyles Styles
styles Text -> Text -> Text
forall a. Semigroup a => a -> a -> a
<> Text
"}"
    ]
  | (Text
selector, Styles
styles) <- Map Text Styles -> [(Text, Styles)]
forall k a. Map k a -> [(k, a)]
M.toList (StyleSheet -> Map Text Styles
getStyleSheet StyleSheet
styleSheet)
  ]
-----------------------------------------------------------------------------
--
-- > style_ [ alignContent =: "value" ]
--
alignContent :: MisoString -> Style
alignContent :: Text -> Style
alignContent Text
x = Text
"align-content" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ alignItems =: "value" ]
--
alignItems :: MisoString -> Style
alignItems :: Text -> Style
alignItems Text
x = Text
"align-items" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ alignSelf =: "value" ]
--
alignSelf :: MisoString -> Style
alignSelf :: Text -> Style
alignSelf Text
x = Text
"align-self" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ animationDelay =: "value" ]
--
animationDelay :: MisoString -> Style
animationDelay :: Text -> Style
animationDelay Text
x = Text
"animation-delay" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ animationDirection =: "value" ]
--
animationDirection :: MisoString -> Style
animationDirection :: Text -> Style
animationDirection Text
x = Text
"animation-direction" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ animationDuration =: "value" ]
--
animationDuration :: MisoString -> Style
animationDuration :: Text -> Style
animationDuration Text
x = Text
"animation-duration" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ animationFillMode =: "value" ]
--
animationFillMode :: MisoString -> Style
animationFillMode :: Text -> Style
animationFillMode Text
x = Text
"animation-fill-mode" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ animationIterationCount =: "value" ]
--
animationIterationCount :: MisoString -> Style
animationIterationCount :: Text -> Style
animationIterationCount Text
x = Text
"animation-iteration-count" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ animation =: "value" ]
--
animation :: MisoString -> Style
animation :: Text -> Style
animation Text
x = Text
"animation" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ animationName =: "value" ]
--
animationName :: MisoString -> Style
animationName :: Text -> Style
animationName Text
x = Text
"animation-name" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ animationPlayState =: "value" ]
--
animationPlayState :: MisoString -> Style
animationPlayState :: Text -> Style
animationPlayState Text
x = Text
"animation-play-state" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ animationTimingFunction =: "value" ]
--
animationTimingFunction :: MisoString -> Style
animationTimingFunction :: Text -> Style
animationTimingFunction Text
x = Text
"animation-timing-function" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ aspectRatio =: "value" ]
--
aspectRatio :: MisoString -> Style
aspectRatio :: Text -> Style
aspectRatio Text
x = Text
"aspect-ratio" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ backgroundClip =: "value" ]
--
backgroundClip :: MisoString -> Style
backgroundClip :: Text -> Style
backgroundClip Text
x = Text
"background-clip" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ backgroundColor =: "value" ]
--
backgroundColor :: Color -> Style
backgroundColor :: Color -> Style
backgroundColor Color
x = Text
"background-color" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Color -> Text
renderColor Color
x
-----------------------------------------------------------------------------
--
-- > style_ [ backgroundImage =: "value" ]
--
backgroundImage :: MisoString -> Style
backgroundImage :: Text -> Style
backgroundImage Text
x = Text
"background-image" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ background =: "value" ]
--
background :: MisoString -> Style
background :: Text -> Style
background Text
x = Text
"background" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ backgroundOrigin =: "value" ]
--
backgroundOrigin :: MisoString -> Style
backgroundOrigin :: Text -> Style
backgroundOrigin Text
x = Text
"background-origin" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ backgroundPosition =: "value" ]
--
backgroundPosition :: MisoString -> Style
backgroundPosition :: Text -> Style
backgroundPosition Text
x = Text
"background-position" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ backgroundRepeat =: "value" ]
--
backgroundRepeat :: MisoString -> Style
backgroundRepeat :: Text -> Style
backgroundRepeat Text
x = Text
"background-repeat" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ backgroundSize =: "value" ]
--
backgroundSize :: MisoString -> Style
backgroundSize :: Text -> Style
backgroundSize Text
x = Text
"background-size" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderBottomColor =: "value" ]
--
borderBottomColor :: Color -> Style
borderBottomColor :: Color -> Style
borderBottomColor Color
x = Text
"border-bottom-color" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Color -> Text
renderColor Color
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderBottomLeftRadius =: "value" ]
--
borderBottomLeftRadius :: MisoString -> Style
borderBottomLeftRadius :: Text -> Style
borderBottomLeftRadius Text
x = Text
"border-bottom-left-radius" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderBottom =: "value" ]
--
borderBottom :: MisoString -> Style
borderBottom :: Text -> Style
borderBottom Text
x = Text
"border-bottom" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderBottomRightRadius =: "value" ]
--
borderBottomRightRadius :: MisoString -> Style
borderBottomRightRadius :: Text -> Style
borderBottomRightRadius Text
x = Text
"border-bottom-right-radius" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderBottomStyle =: "value" ]
--
borderBottomStyle :: MisoString -> Style
borderBottomStyle :: Text -> Style
borderBottomStyle Text
x = Text
"border-bottom-style" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderBottomWidth =: "value" ]
--
borderBottomWidth :: MisoString -> Style
borderBottomWidth :: Text -> Style
borderBottomWidth Text
x = Text
"border-bottom-width" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderColor =: "value" ]
--
borderColor :: Color -> Style
borderColor :: Color -> Style
borderColor Color
x = Text
"border-color" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Color -> Text
renderColor Color
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderEndEndRadius =: "value" ]
--
borderEndEndRadius :: MisoString -> Style
borderEndEndRadius :: Text -> Style
borderEndEndRadius Text
x = Text
"border-end-end-radius" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderEndStartRadius =: "value" ]
--
borderEndStartRadius :: MisoString -> Style
borderEndStartRadius :: Text -> Style
borderEndStartRadius Text
x = Text
"border-end-start-radius" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderInlineEndColor =: "value" ]
--
borderInlineEndColor :: Color -> Style
borderInlineEndColor :: Color -> Style
borderInlineEndColor Color
x = Text
"border-inline-end-color" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Color -> Text
renderColor Color
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderInlineEndStyle =: "value" ]
--
borderInlineEndStyle :: MisoString -> Style
borderInlineEndStyle :: Text -> Style
borderInlineEndStyle Text
x = Text
"border-inline-end-style" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderInlineEndWidth =: "value" ]
--
borderInlineEndWidth :: MisoString -> Style
borderInlineEndWidth :: Text -> Style
borderInlineEndWidth Text
x = Text
"border-inline-end-width" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderInlineStartColor =: "value" ]
--
borderInlineStartColor :: Color -> Style
borderInlineStartColor :: Color -> Style
borderInlineStartColor Color
x = Text
"border-inline-start-color" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Color -> Text
renderColor Color
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderInlineStartStyle =: "value" ]
--
borderInlineStartStyle :: MisoString -> Style
borderInlineStartStyle :: Text -> Style
borderInlineStartStyle Text
x = Text
"border-inline-start-style" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderInlineStartWidth =: "value" ]
--
borderInlineStartWidth :: MisoString -> Style
borderInlineStartWidth :: Text -> Style
borderInlineStartWidth Text
x = Text
"border-inline-start-width" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderLeftColor =: "value" ]
--
borderLeftColor :: Color -> Style
borderLeftColor :: Color -> Style
borderLeftColor Color
x = Text
"border-left-color" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Color -> Text
renderColor Color
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderLeft =: "value" ]
--
borderLeft :: MisoString -> Style
borderLeft :: Text -> Style
borderLeft Text
x = Text
"border-left" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderLeftStyle =: "value" ]
--
borderLeftStyle :: MisoString -> Style
borderLeftStyle :: Text -> Style
borderLeftStyle Text
x = Text
"border-left-style" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderLeftWidth =: "value" ]
--
borderLeftWidth :: MisoString -> Style
borderLeftWidth :: Text -> Style
borderLeftWidth Text
x = Text
"border-left-width" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ border =: "value" ]
--
border :: MisoString -> Style
border :: Text -> Style
border Text
x = Text
"border" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderRadius =: "value" ]
--
borderRadius :: MisoString -> Style
borderRadius :: Text -> Style
borderRadius Text
x = Text
"border-radius" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderRightColor =: "value" ]
--
borderRightColor :: Color -> Style
borderRightColor :: Color -> Style
borderRightColor Color
x = Text
"border-right-color" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Color -> Text
renderColor Color
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderRight =: "value" ]
--
borderRight :: MisoString -> Style
borderRight :: Text -> Style
borderRight Text
x = Text
"border-right" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderRightStyle =: "value" ]
--
borderRightStyle :: MisoString -> Style
borderRightStyle :: Text -> Style
borderRightStyle Text
x = Text
"border-right-style" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderRightWidth =: "value" ]
--
borderRightWidth :: MisoString -> Style
borderRightWidth :: Text -> Style
borderRightWidth Text
x = Text
"border-right-width" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderStartEndRadius =: "value" ]
--
borderStartEndRadius :: MisoString -> Style
borderStartEndRadius :: Text -> Style
borderStartEndRadius Text
x = Text
"border-start-end-radius" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderStartStartRadius =: "value" ]
--
borderStartStartRadius :: MisoString -> Style
borderStartStartRadius :: Text -> Style
borderStartStartRadius Text
x = Text
"border-start-start-radius" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderStyle =: "value" ]
--
borderStyle :: MisoString -> Style
borderStyle :: Text -> Style
borderStyle Text
x = Text
"border-style" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderTopColor =: "value" ]
--
borderTopColor :: Color -> Style
borderTopColor :: Color -> Style
borderTopColor Color
x = Text
"border-top-color" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Color -> Text
renderColor Color
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderTopLeftRadius =: "value" ]
--
borderTopLeftRadius :: MisoString -> Style
borderTopLeftRadius :: Text -> Style
borderTopLeftRadius Text
x = Text
"border-top-left-radius" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderTop =: "value" ]
--
borderTop :: MisoString -> Style
borderTop :: Text -> Style
borderTop Text
x = Text
"border-top" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderTopRightRadius =: "value" ]
--
borderTopRightRadius :: MisoString -> Style
borderTopRightRadius :: Text -> Style
borderTopRightRadius Text
x = Text
"border-top-right-radius" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderTopStyle =: "value" ]
--
borderTopStyle :: MisoString -> Style
borderTopStyle :: Text -> Style
borderTopStyle Text
x = Text
"border-top-style" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderTopWidth =: "value" ]
--
borderTopWidth :: MisoString -> Style
borderTopWidth :: Text -> Style
borderTopWidth Text
x = Text
"border-top-width" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ borderWidth =: "value" ]
--
borderWidth :: MisoString -> Style
borderWidth :: Text -> Style
borderWidth Text
x = Text
"border-width" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ bottom =: "value" ]
--
bottom :: MisoString -> Style
bottom :: Text -> Style
bottom Text
x = Text
"bottom" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ boxShadow =: "value" ]
--
boxShadow :: MisoString -> Style
boxShadow :: Text -> Style
boxShadow Text
x = Text
"box-shadow" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ boxSizing =: "value" ]
--
boxSizing :: MisoString -> Style
boxSizing :: Text -> Style
boxSizing Text
x = Text
"box-sizing" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ clipPath =: "value" ]
--
clipPath :: MisoString -> Style
clipPath :: Text -> Style
clipPath Text
x = Text
"clip-path" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ color =: "value" ]
--
color :: Color -> Style
color :: Color -> Style
color Color
x = Text
"color" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Color -> Text
renderColor Color
x
-----------------------------------------------------------------------------
--
-- > style_ [ columnGap =: "value" ]
--
columnGap :: MisoString -> Style
columnGap :: Text -> Style
columnGap Text
x = Text
"column-gap" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ cssVariable =: "value" ]
--
cssVariable :: MisoString -> Style
cssVariable :: Text -> Style
cssVariable Text
x = Text
"css-variable" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ direction =: "value" ]
--
direction :: MisoString -> Style
direction :: Text -> Style
direction Text
x = Text
"direction" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ display =: "value" ]
--
display :: MisoString -> Style
display :: Text -> Style
display Text
x = Text
"display" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ filter =: "value" ]
--
filter :: MisoString -> Style
filter :: Text -> Style
filter Text
x = Text
"filter" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ flexBasis =: "value" ]
--
flexBasis :: MisoString -> Style
flexBasis :: Text -> Style
flexBasis Text
x = Text
"flex-basis" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ flexDirection =: "value" ]
--
flexDirection :: MisoString -> Style
flexDirection :: Text -> Style
flexDirection Text
x = Text
"flex-direction" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ flexFlow =: "value" ]
--
flexFlow :: MisoString -> Style
flexFlow :: Text -> Style
flexFlow Text
x = Text
"flex-flow" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ flexGrow =: "value" ]
--
flexGrow :: MisoString -> Style
flexGrow :: Text -> Style
flexGrow Text
x = Text
"flex-grow" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ flex =: "value" ]
--
flex :: MisoString -> Style
flex :: Text -> Style
flex Text
x = Text
"flex" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ flexShrink =: "value" ]
--
flexShrink :: MisoString -> Style
flexShrink :: Text -> Style
flexShrink Text
x = Text
"flex-shrink" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ flexWrap =: "value" ]
--
flexWrap :: MisoString -> Style
flexWrap :: Text -> Style
flexWrap Text
x = Text
"flex-wrap" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ fontFamily =: "value" ]
--
fontFamily :: MisoString -> Style
fontFamily :: Text -> Style
fontFamily Text
x = Text
"font-family" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ fontSize =: "value" ]
--
fontSize :: MisoString -> Style
fontSize :: Text -> Style
fontSize Text
x = Text
"font-size" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ fontStyle =: "value" ]
--
fontStyle :: MisoString -> Style
fontStyle :: Text -> Style
fontStyle Text
x = Text
"font-style" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ fontWeight =: "value" ]
--
fontWeight :: MisoString -> Style
fontWeight :: Text -> Style
fontWeight Text
x = Text
"font-weight" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ gap =: "value" ]
--
gap :: MisoString -> Style
gap :: Text -> Style
gap Text
x = Text
"gap" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ gridAutoColumns =: "value" ]
--
gridAutoColumns :: MisoString -> Style
gridAutoColumns :: Text -> Style
gridAutoColumns Text
x = Text
"grid-auto-columns" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ gridAutoFlow =: "value" ]
--
gridAutoFlow :: MisoString -> Style
gridAutoFlow :: Text -> Style
gridAutoFlow Text
x = Text
"grid-auto-flow" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ gridAutoRows =: "value" ]
--
gridAutoRows :: MisoString -> Style
gridAutoRows :: Text -> Style
gridAutoRows Text
x = Text
"grid-auto-rows" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ gridColumnEnd =: "value" ]
--
gridColumnEnd :: MisoString -> Style
gridColumnEnd :: Text -> Style
gridColumnEnd Text
x = Text
"grid-column-end" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ gridColumnSpan =: "value" ]
--
gridColumnSpan :: MisoString -> Style
gridColumnSpan :: Text -> Style
gridColumnSpan Text
x = Text
"grid-column-span" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ gridColumnStart =: "value" ]
--
gridColumnStart :: MisoString -> Style
gridColumnStart :: Text -> Style
gridColumnStart Text
x = Text
"grid-column-start" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ gridRowEnd =: "value" ]
--
gridRowEnd :: MisoString -> Style
gridRowEnd :: Text -> Style
gridRowEnd Text
x = Text
"grid-row-end" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ gridRowSpan =: "value" ]
--
gridRowSpan :: MisoString -> Style
gridRowSpan :: Text -> Style
gridRowSpan Text
x = Text
"grid-row-span" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ gridRowStart =: "value" ]
--
gridRowStart :: MisoString -> Style
gridRowStart :: Text -> Style
gridRowStart Text
x = Text
"grid-row-start" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ gridTemplateColumns =: "value" ]
--
gridTemplateColumns :: MisoString -> Style
gridTemplateColumns :: Text -> Style
gridTemplateColumns Text
x = Text
"grid-template-columns" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ gridTemplateRows =: "value" ]
--
gridTemplateRows :: MisoString -> Style
gridTemplateRows :: Text -> Style
gridTemplateRows Text
x = Text
"grid-template-rows" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ height =: "value" ]
--
height :: MisoString -> Style
height :: Text -> Style
height Text
x = Text
"height" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ imageRendering =: "value" ]
--
imageRendering :: MisoString -> Style
imageRendering :: Text -> Style
imageRendering Text
x = Text
"image-rendering" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ insetInlineEnd =: "value" ]
--
insetInlineEnd :: MisoString -> Style
insetInlineEnd :: Text -> Style
insetInlineEnd Text
x = Text
"inset-inline-end" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ insetInlineStart =: "value" ]
--
insetInlineStart :: MisoString -> Style
insetInlineStart :: Text -> Style
insetInlineStart Text
x = Text
"inset-inline-start" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ justifyContent =: "value" ]
--
justifyContent :: MisoString -> Style
justifyContent :: Text -> Style
justifyContent Text
x = Text
"justify-content" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ justifyItems =: "value" ]
--
justifyItems :: MisoString -> Style
justifyItems :: Text -> Style
justifyItems Text
x = Text
"justify-items" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ justifySelf =: "value" ]
--
justifySelf :: MisoString -> Style
justifySelf :: Text -> Style
justifySelf Text
x = Text
"justify-self" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ left =: "value" ]
--
left :: MisoString -> Style
left :: Text -> Style
left Text
x = Text
"left" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ letterSpacing =: "value" ]
--
letterSpacing :: MisoString -> Style
letterSpacing :: Text -> Style
letterSpacing Text
x = Text
"letter-spacing" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ linearCrossGravity =: "value" ]
--
linearCrossGravity :: MisoString -> Style
linearCrossGravity :: Text -> Style
linearCrossGravity Text
x = Text
"linear-cross-gravity" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ linearDirection =: "value" ]
--
linearDirection :: MisoString -> Style
linearDirection :: Text -> Style
linearDirection Text
x = Text
"linear-direction" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ linearGravity =: "value" ]
--
linearGravity :: MisoString -> Style
linearGravity :: Text -> Style
linearGravity Text
x = Text
"linear-gravity" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ linearLayoutGravity =: "value" ]
--
linearLayoutGravity :: MisoString -> Style
linearLayoutGravity :: Text -> Style
linearLayoutGravity Text
x = Text
"linear-layout-gravity" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ linearWeight =: "value" ]
--
linearWeight :: MisoString -> Style
linearWeight :: Text -> Style
linearWeight Text
x = Text
"linear-weight" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ linearWeightSum =: "value" ]
--
linearWeightSum :: MisoString -> Style
linearWeightSum :: Text -> Style
linearWeightSum Text
x = Text
"linear-weight-sum" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ lineHeight =: "value" ]
--
lineHeight :: MisoString -> Style
lineHeight :: Text -> Style
lineHeight Text
x = Text
"line-height" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ marginBottom =: "value" ]
--
marginBottom :: MisoString -> Style
marginBottom :: Text -> Style
marginBottom Text
x = Text
"margin-bottom" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ marginInlineEnd =: "value" ]
--
marginInlineEnd :: MisoString -> Style
marginInlineEnd :: Text -> Style
marginInlineEnd Text
x = Text
"margin-inline-end" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ marginInlineStart =: "value" ]
--
marginInlineStart :: MisoString -> Style
marginInlineStart :: Text -> Style
marginInlineStart Text
x = Text
"margin-inline-start" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ marginLeft =: "value" ]
--
marginLeft :: MisoString -> Style
marginLeft :: Text -> Style
marginLeft Text
x = Text
"margin-left" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ margin =: "value" ]
--
margin :: MisoString -> Style
margin :: Text -> Style
margin Text
x = Text
"margin" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ marginRight =: "value" ]
--
marginRight :: MisoString -> Style
marginRight :: Text -> Style
marginRight Text
x = Text
"margin-right" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ marginTop =: "value" ]
--
marginTop :: MisoString -> Style
marginTop :: Text -> Style
marginTop Text
x = Text
"margin-top" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ maskImage =: "value" ]
--
maskImage :: MisoString -> Style
maskImage :: Text -> Style
maskImage Text
x = Text
"mask-image" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ mask =: "value" ]
--
mask :: MisoString -> Style
mask :: Text -> Style
mask Text
x = Text
"mask" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ maxHeight =: "value" ]
--
maxHeight :: MisoString -> Style
maxHeight :: Text -> Style
maxHeight Text
x = Text
"max-height" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ maxWidth =: "value" ]
--
maxWidth :: MisoString -> Style
maxWidth :: Text -> Style
maxWidth Text
x = Text
"max-width" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ minHeight =: "value" ]
--
minHeight :: MisoString -> Style
minHeight :: Text -> Style
minHeight Text
x = Text
"min-height" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ minWidth =: "value" ]
--
minWidth :: MisoString -> Style
minWidth :: Text -> Style
minWidth Text
x = Text
"min-width" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ opacity =: "value" ]
--
opacity :: MisoString -> Style
opacity :: Text -> Style
opacity Text
x = Text
"opacity" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ order =: "value" ]
--
order :: MisoString -> Style
order :: Text -> Style
order Text
x = Text
"order" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ overflow =: "value" ]
--
overflow :: MisoString -> Style
overflow :: Text -> Style
overflow Text
x = Text
"overflow" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ overflowX =: "value" ]
--
overflowX :: MisoString -> Style
overflowX :: Text -> Style
overflowX Text
x = Text
"overflow-x" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ overflowY =: "value" ]
--
overflowY :: MisoString -> Style
overflowY :: Text -> Style
overflowY Text
x = Text
"overflow-y" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ paddingBottom =: "value" ]
--
paddingBottom :: MisoString -> Style
paddingBottom :: Text -> Style
paddingBottom Text
x = Text
"padding-bottom" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ paddingInlineEnd =: "value" ]
--
paddingInlineEnd :: MisoString -> Style
paddingInlineEnd :: Text -> Style
paddingInlineEnd Text
x = Text
"padding-inline-end" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ paddingInlineStart =: "value" ]
--
paddingInlineStart :: MisoString -> Style
paddingInlineStart :: Text -> Style
paddingInlineStart Text
x = Text
"padding-inline-start" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ paddingLeft =: "value" ]
--
paddingLeft :: MisoString -> Style
paddingLeft :: Text -> Style
paddingLeft Text
x = Text
"padding-left" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ padding =: "value" ]
--
padding :: MisoString -> Style
padding :: Text -> Style
padding Text
x = Text
"padding" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ paddingRight =: "value" ]
--
paddingRight :: MisoString -> Style
paddingRight :: Text -> Style
paddingRight Text
x = Text
"padding-right" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ paddingTop =: "value" ]
--
paddingTop :: MisoString -> Style
paddingTop :: Text -> Style
paddingTop Text
x = Text
"padding-top" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ perspective =: "value" ]
--
perspective :: MisoString -> Style
perspective :: Text -> Style
perspective Text
x = Text
"perspective" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ position =: "value" ]
--
position :: MisoString -> Style
position :: Text -> Style
position Text
x = Text
"position" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ relativeAlignBottom =: "value" ]
--
relativeAlignBottom :: MisoString -> Style
relativeAlignBottom :: Text -> Style
relativeAlignBottom Text
x = Text
"relative-align-bottom" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ relativeAlignInlineEnd =: "value" ]
--
relativeAlignInlineEnd :: MisoString -> Style
relativeAlignInlineEnd :: Text -> Style
relativeAlignInlineEnd Text
x = Text
"relative-align-inline-end" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ relativeAlignInlineStart =: "value" ]
--
relativeAlignInlineStart :: MisoString -> Style
relativeAlignInlineStart :: Text -> Style
relativeAlignInlineStart Text
x = Text
"relative-align-inline-start" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ relativeAlignLeft =: "value" ]
--
relativeAlignLeft :: MisoString -> Style
relativeAlignLeft :: Text -> Style
relativeAlignLeft Text
x = Text
"relative-align-left" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ relativeAlignRight =: "value" ]
--
relativeAlignRight :: MisoString -> Style
relativeAlignRight :: Text -> Style
relativeAlignRight Text
x = Text
"relative-align-right" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ relativeAlignTop =: "value" ]
--
relativeAlignTop :: MisoString -> Style
relativeAlignTop :: Text -> Style
relativeAlignTop Text
x = Text
"relative-align-top" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ relativeBottomOf =: "value" ]
--
relativeBottomOf :: MisoString -> Style
relativeBottomOf :: Text -> Style
relativeBottomOf Text
x = Text
"relative-bottom-of" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ relativeCenter =: "value" ]
--
relativeCenter :: MisoString -> Style
relativeCenter :: Text -> Style
relativeCenter Text
x = Text
"relative-center" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ relativeId =: "value" ]
--
relativeId :: MisoString -> Style
relativeId :: Text -> Style
relativeId Text
x = Text
"relative-id" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ relativeInlineEndOf =: "value" ]
--
relativeInlineEndOf :: MisoString -> Style
relativeInlineEndOf :: Text -> Style
relativeInlineEndOf Text
x = Text
"relative-inline-end-of" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ relativeInlineStartOf =: "value" ]
--
relativeInlineStartOf :: MisoString -> Style
relativeInlineStartOf :: Text -> Style
relativeInlineStartOf Text
x = Text
"relative-inline-start-of" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ relativeLayoutOnce =: "value" ]
--
relativeLayoutOnce :: MisoString -> Style
relativeLayoutOnce :: Text -> Style
relativeLayoutOnce Text
x = Text
"relative-layout-once" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ relativeLeftOf =: "value" ]
--
relativeLeftOf :: MisoString -> Style
relativeLeftOf :: Text -> Style
relativeLeftOf Text
x = Text
"relative-left-of" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ relativeRightOf =: "value" ]
--
relativeRightOf :: MisoString -> Style
relativeRightOf :: Text -> Style
relativeRightOf Text
x = Text
"relative-right-of" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ relativeTopOf =: "value" ]
--
relativeTopOf :: MisoString -> Style
relativeTopOf :: Text -> Style
relativeTopOf Text
x = Text
"relative-top-of" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ right =: "value" ]
--
right :: MisoString -> Style
right :: Text -> Style
right Text
x = Text
"right" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ rowGap =: "value" ]
--
rowGap :: MisoString -> Style
rowGap :: Text -> Style
rowGap Text
x = Text
"row-gap" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ textAlign =: "value" ]
--
textAlign :: MisoString -> Style
textAlign :: Text -> Style
textAlign Text
x = Text
"text-align" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ textDecoration =: "value" ]
--
textDecoration :: MisoString -> Style
textDecoration :: Text -> Style
textDecoration Text
x = Text
"text-decoration" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ textIndent =: "value" ]
--
textIndent :: MisoString -> Style
textIndent :: Text -> Style
textIndent Text
x = Text
"text-indent" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ textOverflow =: "value" ]
--
textOverflow :: MisoString -> Style
textOverflow :: Text -> Style
textOverflow Text
x = Text
"text-overflow" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ textShadow =: "value" ]
--
textShadow :: MisoString -> Style
textShadow :: Text -> Style
textShadow Text
x = Text
"text-shadow" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ textStrokeColor =: "value" ]
--
textStrokeColor :: Color -> Style
textStrokeColor :: Color -> Style
textStrokeColor Color
x = Text
"text-stroke-color" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Color -> Text
renderColor Color
x
-----------------------------------------------------------------------------
--
-- > style_ [ textStroke =: "value" ]
--
textStroke :: MisoString -> Style
textStroke :: Text -> Style
textStroke Text
x = Text
"text-stroke" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ textStrokeWidth =: "value" ]
--
textStrokeWidth :: MisoString -> Style
textStrokeWidth :: Text -> Style
textStrokeWidth Text
x = Text
"text-stroke-width" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ top =: "value" ]
--
top :: MisoString -> Style
top :: Text -> Style
top Text
x = Text
"top" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ transform =: "value" ]
--
transform :: MisoString -> Style
transform :: Text -> Style
transform Text
x = Text
"transform" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ transformOrigin =: "value" ]
--
transformOrigin :: MisoString -> Style
transformOrigin :: Text -> Style
transformOrigin Text
x = Text
"transform-origin" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ transitionDelay =: "value" ]
--
transitionDelay :: MisoString -> Style
transitionDelay :: Text -> Style
transitionDelay Text
x = Text
"transition-delay" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ transitionDuration =: "value" ]
--
transitionDuration :: MisoString -> Style
transitionDuration :: Text -> Style
transitionDuration Text
x = Text
"transition-duration" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ transition =: "value" ]
--
transition :: MisoString -> Style
transition :: Text -> Style
transition Text
x = Text
"transition" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ transitionProperty =: "value" ]
--
transitionProperty :: MisoString -> Style
transitionProperty :: Text -> Style
transitionProperty Text
x = Text
"transition-property" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ transitionTimingFunction =: "value" ]
--
transitionTimingFunction :: MisoString -> Style
transitionTimingFunction :: Text -> Style
transitionTimingFunction Text
x = Text
"transition-timing-function" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ verticalAlign =: "value" ]
--
verticalAlign :: MisoString -> Style
verticalAlign :: Text -> Style
verticalAlign Text
x = Text
"vertical-align" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ visibility =: "value" ]
--
visibility :: MisoString -> Style
visibility :: Text -> Style
visibility Text
x = Text
"visibility" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ whiteSpace =: "value" ]
--
whiteSpace :: MisoString -> Style
whiteSpace :: Text -> Style
whiteSpace Text
x = Text
"white-space" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ width =: "value" ]
--
width :: MisoString -> Style
width :: Text -> Style
width Text
x = Text
"width" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ wordBreak =: "value" ]
--
wordBreak :: MisoString -> Style
wordBreak :: Text -> Style
wordBreak Text
x = Text
"word-break" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ xAutoFontSize =: "value" ]
--
xAutoFontSize :: MisoString -> Style
xAutoFontSize :: Text -> Style
xAutoFontSize Text
x = Text
"-x-auto-font-size" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ xAutoFontSizePresetSizes =: "value" ]
--
xAutoFontSizePresetSizes :: MisoString -> Style
xAutoFontSizePresetSizes :: Text -> Style
xAutoFontSizePresetSizes Text
x = Text
"-x-auto-font-size-preset-sizes" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ xHandleColor =: "value" ]
--
xHandleColor :: Color -> Style
xHandleColor :: Color -> Style
xHandleColor Color
x = Text
"-x-handle-color" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Color -> Text
renderColor Color
x
-----------------------------------------------------------------------------
--
-- > style_ [ xHandleSize =: "value" ]
--
xHandleSize :: MisoString -> Style
xHandleSize :: Text -> Style
xHandleSize Text
x = Text
"-x-handle-size" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------
--
-- > style_ [ zIndex =: "value" ]
--
zIndex :: MisoString -> Style
zIndex :: Text -> Style
zIndex Text
x = Text
"z-index" Text -> Text -> Style
forall k v. k -> v -> (k, v)
=: Text
x
-----------------------------------------------------------------------------