{-|
Module      : Css.Properties
Description : Module which contain (almost) all CSS3 properties
Copyright   : (c) Alexey Seledkov, 2022
License     : GPL-3
Maintainer  : qyutou@gmail.com
Stability   : experimental
Portability : portable
-}

{-# LANGUAGE OverloadedStrings #-}

module Css.Properties where

import           Css.Internal (Css, declaration)
import           Data.Text    (Text)

-- | CSS Property "accent-color"
accentColor
    :: Text   -- ^ Value
    -> Css () -- ^ Return as CSS
accentColor :: Text -> Css ()
accentColor = Text -> Text -> Css ()
declaration Text
"accent-color"

-- | CSS Property "align-content"
alignContent
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
alignContent :: Text -> Css ()
alignContent = Text -> Text -> Css ()
declaration Text
"align-content"

-- | CSS Property "align-items"
alignItems
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
alignItems :: Text -> Css ()
alignItems = Text -> Text -> Css ()
declaration Text
"align-items"

-- | CSS Property "align-self"
alignSelf
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
alignSelf :: Text -> Css ()
alignSelf = Text -> Text -> Css ()
declaration Text
"align-self"

-- | CSS Property "all"
all
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
all :: Text -> Css ()
all = Text -> Text -> Css ()
declaration Text
"all"

-- | CSS Property "animation"
animation
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
animation :: Text -> Css ()
animation = Text -> Text -> Css ()
declaration Text
"animation"

-- | CSS Property "animation-delay"
animationDelay
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
animationDelay :: Text -> Css ()
animationDelay = Text -> Text -> Css ()
declaration Text
"animation-delay"

-- | CSS Property "animation-direction"
animationDirection
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
animationDirection :: Text -> Css ()
animationDirection = Text -> Text -> Css ()
declaration Text
"animation-direction"

-- | CSS Property "animation-duration"
animationDuration
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
animationDuration :: Text -> Css ()
animationDuration = Text -> Text -> Css ()
declaration Text
"animation-duration"

-- | CSS Property "animation-fill-mode"
animationFillMode
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
animationFillMode :: Text -> Css ()
animationFillMode = Text -> Text -> Css ()
declaration Text
"animation-fill-mode"

-- | CSS Property "animation-iteration-count"
animationIterationCount
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
animationIterationCount :: Text -> Css ()
animationIterationCount = Text -> Text -> Css ()
declaration Text
"animation-iteration-count"

-- | CSS Property "animation-name"
animationName
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
animationName :: Text -> Css ()
animationName = Text -> Text -> Css ()
declaration Text
"animation-name"

-- | CSS Property "animation-play-state"
animationPlayState
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
animationPlayState :: Text -> Css ()
animationPlayState = Text -> Text -> Css ()
declaration Text
"animation-play-state"

-- | CSS Property "animation-timing-function"
animationTimingFunction
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
animationTimingFunction :: Text -> Css ()
animationTimingFunction = Text -> Text -> Css ()
declaration Text
"animation-timing-function"

-- | CSS Property "backdrop-filter"
backdropFilter
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
backdropFilter :: Text -> Css ()
backdropFilter = Text -> Text -> Css ()
declaration Text
"backdrop-filter"

-- | CSS Property "backface-visibility"
backfaceVisibility
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
backfaceVisibility :: Text -> Css ()
backfaceVisibility = Text -> Text -> Css ()
declaration Text
"backface-visibility"

-- | CSS Property "background"
background
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
background :: Text -> Css ()
background = Text -> Text -> Css ()
declaration Text
"background"

-- | CSS Property "background-attachment"
backgroundAttachment
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
backgroundAttachment :: Text -> Css ()
backgroundAttachment = Text -> Text -> Css ()
declaration Text
"background-attachment"

-- | CSS Property "background-blend-mode"
backgroundBlendMode
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
backgroundBlendMode :: Text -> Css ()
backgroundBlendMode = Text -> Text -> Css ()
declaration Text
"background-blend-mode"

-- | CSS Property "background-clip"
backgroundClip
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
backgroundClip :: Text -> Css ()
backgroundClip = Text -> Text -> Css ()
declaration Text
"background-clip"

-- | CSS Property "background-color"
backgroundColor
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
backgroundColor :: Text -> Css ()
backgroundColor = Text -> Text -> Css ()
declaration Text
"background-color"

-- | CSS Property "background-image"
backgroundImage
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
backgroundImage :: Text -> Css ()
backgroundImage = Text -> Text -> Css ()
declaration Text
"background-image"

-- | CSS Property "background-origin"
backgroundOrigin
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
backgroundOrigin :: Text -> Css ()
backgroundOrigin = Text -> Text -> Css ()
declaration Text
"background-origin"

-- | CSS Property "background-position"
backgroundPosition
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
backgroundPosition :: Text -> Css ()
backgroundPosition = Text -> Text -> Css ()
declaration Text
"background-position"

-- | CSS Property "background-repeat"
backgroundRepeat
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
backgroundRepeat :: Text -> Css ()
backgroundRepeat = Text -> Text -> Css ()
declaration Text
"background-repeat"

-- | CSS Property "background-size"
backgroundSize
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
backgroundSize :: Text -> Css ()
backgroundSize = Text -> Text -> Css ()
declaration Text
"background-size"

-- | CSS Property "border"
border
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
border :: Text -> Css ()
border = Text -> Text -> Css ()
declaration Text
"border"

-- | CSS Property "border-bottom"
borderBottom
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderBottom :: Text -> Css ()
borderBottom = Text -> Text -> Css ()
declaration Text
"border-bottom"

-- | CSS Property "border-bottom-color"
borderBottomColor
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderBottomColor :: Text -> Css ()
borderBottomColor = Text -> Text -> Css ()
declaration Text
"border-bottom-color"

-- | CSS Property "border-bottom-left-radius"
borderBottomLeftRadius
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderBottomLeftRadius :: Text -> Css ()
borderBottomLeftRadius = Text -> Text -> Css ()
declaration Text
"border-bottom-left-radius"

-- | CSS Property "border-bottom-right-radius"
borderBottomRightRadius
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderBottomRightRadius :: Text -> Css ()
borderBottomRightRadius = Text -> Text -> Css ()
declaration Text
"border-bottom-right-radius"

-- | CSS Property "border-bottom-style"
borderBottomStyle
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderBottomStyle :: Text -> Css ()
borderBottomStyle = Text -> Text -> Css ()
declaration Text
"border-bottom-style"

-- | CSS Property "border-bottom-width"
borderBottomWidth
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderBottomWidth :: Text -> Css ()
borderBottomWidth = Text -> Text -> Css ()
declaration Text
"border-bottom-width"

-- | CSS Property "border-collapse"
borderCollapse
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderCollapse :: Text -> Css ()
borderCollapse = Text -> Text -> Css ()
declaration Text
"border-collapse"

-- | CSS Property "border-color"
borderColor
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderColor :: Text -> Css ()
borderColor = Text -> Text -> Css ()
declaration Text
"border-color"

-- | CSS Property "border-image"
borderImage
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderImage :: Text -> Css ()
borderImage = Text -> Text -> Css ()
declaration Text
"border-image"

-- | CSS Property "border-image-outset"
borderImageOutset
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderImageOutset :: Text -> Css ()
borderImageOutset = Text -> Text -> Css ()
declaration Text
"border-image-outset"

-- | CSS Property "border-image-repeat"
borderImageRepeat
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderImageRepeat :: Text -> Css ()
borderImageRepeat = Text -> Text -> Css ()
declaration Text
"border-image-repeat"

-- | CSS Property "border-image-slice"
borderImageSlice
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderImageSlice :: Text -> Css ()
borderImageSlice = Text -> Text -> Css ()
declaration Text
"border-image-slice"

-- | CSS Property "border-image-source"
borderImageSource
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderImageSource :: Text -> Css ()
borderImageSource = Text -> Text -> Css ()
declaration Text
"border-image-source"

-- | CSS Property "border-image-width"
borderImageWidth
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderImageWidth :: Text -> Css ()
borderImageWidth = Text -> Text -> Css ()
declaration Text
"border-image-width"

-- | CSS Property "border-left"
borderLeft
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderLeft :: Text -> Css ()
borderLeft = Text -> Text -> Css ()
declaration Text
"border-left"

-- | CSS Property "border-left-color"
borderLeftColor
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderLeftColor :: Text -> Css ()
borderLeftColor = Text -> Text -> Css ()
declaration Text
"border-left-color"

-- | CSS Property "border-left-style"
borderLeftStyle
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderLeftStyle :: Text -> Css ()
borderLeftStyle = Text -> Text -> Css ()
declaration Text
"border-left-style"

-- | CSS Property "border-left-width"
borderLeftWidth
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderLeftWidth :: Text -> Css ()
borderLeftWidth = Text -> Text -> Css ()
declaration Text
"border-left-width"

-- | CSS Property "border-radius"
borderRadius
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderRadius :: Text -> Css ()
borderRadius = Text -> Text -> Css ()
declaration Text
"border-radius"

-- | CSS Property "border-right"
borderRight
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderRight :: Text -> Css ()
borderRight = Text -> Text -> Css ()
declaration Text
"border-right"

-- | CSS Property "border-right-color"
borderRightColor
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderRightColor :: Text -> Css ()
borderRightColor = Text -> Text -> Css ()
declaration Text
"border-right-color"

-- | CSS Property "border-right-style"
borderRightStyle
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderRightStyle :: Text -> Css ()
borderRightStyle = Text -> Text -> Css ()
declaration Text
"border-right-style"

-- | CSS Property "border-right-width"
borderRightWidth
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderRightWidth :: Text -> Css ()
borderRightWidth = Text -> Text -> Css ()
declaration Text
"border-right-width"

-- | CSS Property "border-spacing"
borderSpacing
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderSpacing :: Text -> Css ()
borderSpacing = Text -> Text -> Css ()
declaration Text
"border-spacing"

-- | CSS Property "border-style"
borderStyle
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderStyle :: Text -> Css ()
borderStyle = Text -> Text -> Css ()
declaration Text
"border-style"

-- | CSS Property "border-top"
borderTop
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderTop :: Text -> Css ()
borderTop = Text -> Text -> Css ()
declaration Text
"border-top"

-- | CSS Property "border-top-color"
borderTopColor
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderTopColor :: Text -> Css ()
borderTopColor = Text -> Text -> Css ()
declaration Text
"border-top-color"

-- | CSS Property "border-top-left-radius"
borderTopLeftRadius
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderTopLeftRadius :: Text -> Css ()
borderTopLeftRadius = Text -> Text -> Css ()
declaration Text
"border-top-left-radius"

-- | CSS Property "border-top-right-radius"
borderTopRightRadius
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderTopRightRadius :: Text -> Css ()
borderTopRightRadius = Text -> Text -> Css ()
declaration Text
"border-top-right-radius"

-- | CSS Property "border-top-style"
borderTopStyle
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderTopStyle :: Text -> Css ()
borderTopStyle = Text -> Text -> Css ()
declaration Text
"border-top-style"

-- | CSS Property "border-top-width"
borderTopWidth
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderTopWidth :: Text -> Css ()
borderTopWidth = Text -> Text -> Css ()
declaration Text
"border-top-width"

-- | CSS Property "border-width"
borderWidth
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
borderWidth :: Text -> Css ()
borderWidth = Text -> Text -> Css ()
declaration Text
"border-width"

-- | CSS Property "bottom"
bottom
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
bottom :: Text -> Css ()
bottom = Text -> Text -> Css ()
declaration Text
"bottom"

-- | CSS Property "box-decoration-break"
boxDecorationBreak
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
boxDecorationBreak :: Text -> Css ()
boxDecorationBreak = Text -> Text -> Css ()
declaration Text
"box-decoration-break"

-- | CSS Property "box-shadow"
boxShadow
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
boxShadow :: Text -> Css ()
boxShadow = Text -> Text -> Css ()
declaration Text
"box-shadow"

-- | CSS Property "box-sizing"
boxSizing
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
boxSizing :: Text -> Css ()
boxSizing = Text -> Text -> Css ()
declaration Text
"box-sizing"

-- | CSS Property "break-after"
breakAfter
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
breakAfter :: Text -> Css ()
breakAfter = Text -> Text -> Css ()
declaration Text
"break-after"

-- | CSS Property "break-before"
breakBefore
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
breakBefore :: Text -> Css ()
breakBefore = Text -> Text -> Css ()
declaration Text
"break-before"

-- | CSS Property "break-inside"
breakInside
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
breakInside :: Text -> Css ()
breakInside = Text -> Text -> Css ()
declaration Text
"break-inside"

-- | CSS Property "caption-side"
captionSide
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
captionSide :: Text -> Css ()
captionSide = Text -> Text -> Css ()
declaration Text
"caption-side"

-- | CSS Property "caret-color"
caretColor
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
caretColor :: Text -> Css ()
caretColor = Text -> Text -> Css ()
declaration Text
"caret-color"

-- | CSS Property "@charset"
charset
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
charset :: Text -> Css ()
charset = Text -> Text -> Css ()
declaration Text
"@charset"

-- | CSS Property "clear"
clear
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
clear :: Text -> Css ()
clear = Text -> Text -> Css ()
declaration Text
"clear"

-- | CSS Property "clip"
clip
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
clip :: Text -> Css ()
clip = Text -> Text -> Css ()
declaration Text
"clip"

-- | CSS Property "color"
color
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
color :: Text -> Css ()
color = Text -> Text -> Css ()
declaration Text
"color"

-- | CSS Property "column-count"
columnCount
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
columnCount :: Text -> Css ()
columnCount = Text -> Text -> Css ()
declaration Text
"column-count"

-- | CSS Property "column-fill"
columnFill
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
columnFill :: Text -> Css ()
columnFill = Text -> Text -> Css ()
declaration Text
"column-fill"

-- | CSS Property "column-gap"
columnGap
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
columnGap :: Text -> Css ()
columnGap = Text -> Text -> Css ()
declaration Text
"column-gap"

-- | CSS Property "column-rule"
columnRule
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
columnRule :: Text -> Css ()
columnRule = Text -> Text -> Css ()
declaration Text
"column-rule"

-- | CSS Property "column-rule-color"
columnRuleColor
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
columnRuleColor :: Text -> Css ()
columnRuleColor = Text -> Text -> Css ()
declaration Text
"column-rule-color"

-- | CSS Property "column-rule-style"
columnRuleStyle
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
columnRuleStyle :: Text -> Css ()
columnRuleStyle = Text -> Text -> Css ()
declaration Text
"column-rule-style"

-- | CSS Property "column-rule-width"
columnRuleWidth
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
columnRuleWidth :: Text -> Css ()
columnRuleWidth = Text -> Text -> Css ()
declaration Text
"column-rule-width"

-- | CSS Property "column-span"
columnSpan
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
columnSpan :: Text -> Css ()
columnSpan = Text -> Text -> Css ()
declaration Text
"column-span"

-- | CSS Property "column-width"
columnWidth
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
columnWidth :: Text -> Css ()
columnWidth = Text -> Text -> Css ()
declaration Text
"column-width"

-- | CSS Property "columns"
columns
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
columns :: Text -> Css ()
columns = Text -> Text -> Css ()
declaration Text
"columns"

-- | CSS Property "content"
content
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
content :: Text -> Css ()
content = Text -> Text -> Css ()
declaration Text
"content"

-- | CSS Property "counter-increment"
counterIncrement
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
counterIncrement :: Text -> Css ()
counterIncrement = Text -> Text -> Css ()
declaration Text
"counter-increment"

-- | CSS Property "counter-reset"
counterReset
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
counterReset :: Text -> Css ()
counterReset = Text -> Text -> Css ()
declaration Text
"counter-reset"

-- | CSS Property "cursor"
cursor
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
cursor :: Text -> Css ()
cursor = Text -> Text -> Css ()
declaration Text
"cursor"

-- | CSS Property "direction"
direction
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
direction :: Text -> Css ()
direction = Text -> Text -> Css ()
declaration Text
"direction"

-- | CSS Property "display"
display
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
display :: Text -> Css ()
display = Text -> Text -> Css ()
declaration Text
"display"

-- | CSS Property "empty-cells"
emptyCells
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
emptyCells :: Text -> Css ()
emptyCells = Text -> Text -> Css ()
declaration Text
"empty-cells"

-- | CSS Property "filter"
filter
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
filter :: Text -> Css ()
filter = Text -> Text -> Css ()
declaration Text
"filter"

-- | CSS Property "flex"
flex
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
flex :: Text -> Css ()
flex = Text -> Text -> Css ()
declaration Text
"flex"

-- | CSS Property "flex-basis"
flexBasis
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
flexBasis :: Text -> Css ()
flexBasis = Text -> Text -> Css ()
declaration Text
"flex-basis"

-- | CSS Property "flex-direction"
flexDirection
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
flexDirection :: Text -> Css ()
flexDirection = Text -> Text -> Css ()
declaration Text
"flex-direction"

-- | CSS Property "flex-flow"
flexFlow
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
flexFlow :: Text -> Css ()
flexFlow = Text -> Text -> Css ()
declaration Text
"flex-flow"

-- | CSS Property "flex-grow"
flexGrow
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
flexGrow :: Text -> Css ()
flexGrow = Text -> Text -> Css ()
declaration Text
"flex-grow"

-- | CSS Property "flex-shrink"
flexShrink
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
flexShrink :: Text -> Css ()
flexShrink = Text -> Text -> Css ()
declaration Text
"flex-shrink"

-- | CSS Property "flex-wrap"
flexWrap
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
flexWrap :: Text -> Css ()
flexWrap = Text -> Text -> Css ()
declaration Text
"flex-wrap"

-- | CSS Property "float"
float
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
float :: Text -> Css ()
float = Text -> Text -> Css ()
declaration Text
"float"

-- | CSS Property "font"
font
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
font :: Text -> Css ()
font = Text -> Text -> Css ()
declaration Text
"font"

-- | CSS Property "@font-face"
fontFace
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
fontFace :: Text -> Css ()
fontFace = Text -> Text -> Css ()
declaration Text
"@font-face"

-- | CSS Property "font-family"
fontFamily
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
fontFamily :: Text -> Css ()
fontFamily = Text -> Text -> Css ()
declaration Text
"font-family"

-- | CSS Property "font-feature-settings"
fontFeatureSettings
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
fontFeatureSettings :: Text -> Css ()
fontFeatureSettings = Text -> Text -> Css ()
declaration Text
"font-feature-settings"

-- | CSS Property "@font-feature-values"
fontFeatureValues
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
fontFeatureValues :: Text -> Css ()
fontFeatureValues = Text -> Text -> Css ()
declaration Text
"@font-feature-values"

-- | CSS Property "font-kerning"
fontKerning
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
fontKerning :: Text -> Css ()
fontKerning = Text -> Text -> Css ()
declaration Text
"font-kerning"

-- | CSS Property "font-language-override"
fontLanguageOverride
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
fontLanguageOverride :: Text -> Css ()
fontLanguageOverride = Text -> Text -> Css ()
declaration Text
"font-language-override"

-- | CSS Property "font-size"
fontSize
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
fontSize :: Text -> Css ()
fontSize = Text -> Text -> Css ()
declaration Text
"font-size"

-- | CSS Property "font-size-adjust"
fontSizeAdjust
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
fontSizeAdjust :: Text -> Css ()
fontSizeAdjust = Text -> Text -> Css ()
declaration Text
"font-size-adjust"

-- | CSS Property "font-stretch"
fontStretch
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
fontStretch :: Text -> Css ()
fontStretch = Text -> Text -> Css ()
declaration Text
"font-stretch"

-- | CSS Property "font-style"
fontStyle
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
fontStyle :: Text -> Css ()
fontStyle = Text -> Text -> Css ()
declaration Text
"font-style"

-- | CSS Property "font-synthesis"
fontSynthesis
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
fontSynthesis :: Text -> Css ()
fontSynthesis = Text -> Text -> Css ()
declaration Text
"font-synthesis"

-- | CSS Property "font-variant"
fontVariant
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
fontVariant :: Text -> Css ()
fontVariant = Text -> Text -> Css ()
declaration Text
"font-variant"

-- | CSS Property "font-variant-alternates"
fontVariantAlternates
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
fontVariantAlternates :: Text -> Css ()
fontVariantAlternates = Text -> Text -> Css ()
declaration Text
"font-variant-alternates"

-- | CSS Property "font-variant-caps"
fontVariantCaps
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
fontVariantCaps :: Text -> Css ()
fontVariantCaps = Text -> Text -> Css ()
declaration Text
"font-variant-caps"

-- | CSS Property "font-variant-east-asian"
fontVariantEastAsian
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
fontVariantEastAsian :: Text -> Css ()
fontVariantEastAsian = Text -> Text -> Css ()
declaration Text
"font-variant-east-asian"

-- | CSS Property "font-variant-ligatures"
fontVariantLigatures
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
fontVariantLigatures :: Text -> Css ()
fontVariantLigatures = Text -> Text -> Css ()
declaration Text
"font-variant-ligatures"

-- | CSS Property "font-variant-numeric"
fontVariantNumeric
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
fontVariantNumeric :: Text -> Css ()
fontVariantNumeric = Text -> Text -> Css ()
declaration Text
"font-variant-numeric"

-- | CSS Property "font-variant-position"
fontVariantPosition
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
fontVariantPosition :: Text -> Css ()
fontVariantPosition = Text -> Text -> Css ()
declaration Text
"font-variant-position"

-- | CSS Property "font-weight"
fontWeight
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
fontWeight :: Text -> Css ()
fontWeight = Text -> Text -> Css ()
declaration Text
"font-weight"

-- | CSS Property "gap"
gap
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
gap :: Text -> Css ()
gap = Text -> Text -> Css ()
declaration Text
"gap"

-- | CSS Property "grid"
grid
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
grid :: Text -> Css ()
grid = Text -> Text -> Css ()
declaration Text
"grid"

-- | CSS Property "grid-area"
gridArea
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
gridArea :: Text -> Css ()
gridArea = Text -> Text -> Css ()
declaration Text
"grid-area"

-- | CSS Property "grid-auto-columns"
gridAutoColumns
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
gridAutoColumns :: Text -> Css ()
gridAutoColumns = Text -> Text -> Css ()
declaration Text
"grid-auto-columns"

-- | CSS Property "grid-auto-flow"
gridAutoFlow
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
gridAutoFlow :: Text -> Css ()
gridAutoFlow = Text -> Text -> Css ()
declaration Text
"grid-auto-flow"

-- | CSS Property "grid-auto-rows"
gridAutoRows
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
gridAutoRows :: Text -> Css ()
gridAutoRows = Text -> Text -> Css ()
declaration Text
"grid-auto-rows"

-- | CSS Property "grid-column"
gridColumn
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
gridColumn :: Text -> Css ()
gridColumn = Text -> Text -> Css ()
declaration Text
"grid-column"

-- | CSS Property "grid-column-end"
gridColumnEnd
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
gridColumnEnd :: Text -> Css ()
gridColumnEnd = Text -> Text -> Css ()
declaration Text
"grid-column-end"

-- | CSS Property "grid-column-gap"
gridColumnGap
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
gridColumnGap :: Text -> Css ()
gridColumnGap = Text -> Text -> Css ()
declaration Text
"grid-column-gap"

-- | CSS Property "grid-column-start"
gridColumnStart
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
gridColumnStart :: Text -> Css ()
gridColumnStart = Text -> Text -> Css ()
declaration Text
"grid-column-start"

-- | CSS Property "grid-gap"
gridGap
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
gridGap :: Text -> Css ()
gridGap = Text -> Text -> Css ()
declaration Text
"grid-gap"

-- | CSS Property "grid-row"
gridRow
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
gridRow :: Text -> Css ()
gridRow = Text -> Text -> Css ()
declaration Text
"grid-row"

-- | CSS Property "grid-row-end"
gridRowEnd
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
gridRowEnd :: Text -> Css ()
gridRowEnd = Text -> Text -> Css ()
declaration Text
"grid-row-end"

-- | CSS Property "grid-row-gap"
gridRowGap
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
gridRowGap :: Text -> Css ()
gridRowGap = Text -> Text -> Css ()
declaration Text
"grid-row-gap"

-- | CSS Property "grid-row-start"
gridRowStart
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
gridRowStart :: Text -> Css ()
gridRowStart = Text -> Text -> Css ()
declaration Text
"grid-row-start"

-- | CSS Property "grid-template"
gridTemplate
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
gridTemplate :: Text -> Css ()
gridTemplate = Text -> Text -> Css ()
declaration Text
"grid-template"

-- | CSS Property "grid-template-areas"
gridTemplateAreas
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
gridTemplateAreas :: Text -> Css ()
gridTemplateAreas = Text -> Text -> Css ()
declaration Text
"grid-template-areas"

-- | CSS Property "grid-template-columns"
gridTemplateColumns
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
gridTemplateColumns :: Text -> Css ()
gridTemplateColumns = Text -> Text -> Css ()
declaration Text
"grid-template-columns"

-- | CSS Property "grid-template-rows"
gridTemplateRows
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
gridTemplateRows :: Text -> Css ()
gridTemplateRows = Text -> Text -> Css ()
declaration Text
"grid-template-rows"

-- | CSS Property "hanging-punctuation"
hangingPunctuation
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
hangingPunctuation :: Text -> Css ()
hangingPunctuation = Text -> Text -> Css ()
declaration Text
"hanging-punctuation"

-- | CSS Property "height"
height
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
height :: Text -> Css ()
height = Text -> Text -> Css ()
declaration Text
"height"

-- | CSS Property "hyphens"
hyphens
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
hyphens :: Text -> Css ()
hyphens = Text -> Text -> Css ()
declaration Text
"hyphens"

-- | CSS Property "image-rendering"
imageRendering
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
imageRendering :: Text -> Css ()
imageRendering = Text -> Text -> Css ()
declaration Text
"image-rendering"

-- | CSS Property "@import"
import_
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
import_ :: Text -> Css ()
import_ = Text -> Text -> Css ()
declaration Text
"@import"

-- | CSS Property "isolation"
isolation
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
isolation :: Text -> Css ()
isolation = Text -> Text -> Css ()
declaration Text
"isolation"

-- | CSS Property "justify-content"
justifyContent
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
justifyContent :: Text -> Css ()
justifyContent = Text -> Text -> Css ()
declaration Text
"justify-content"

-- | CSS Property "@keyframes"
keyframes
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
keyframes :: Text -> Css ()
keyframes = Text -> Text -> Css ()
declaration Text
"@keyframes"

-- | CSS Property "left"
left
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
left :: Text -> Css ()
left = Text -> Text -> Css ()
declaration Text
"left"

-- | CSS Property "letter-spacing"
letterSpacing
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
letterSpacing :: Text -> Css ()
letterSpacing = Text -> Text -> Css ()
declaration Text
"letter-spacing"

-- | CSS Property "line-break"
lineBreak
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
lineBreak :: Text -> Css ()
lineBreak = Text -> Text -> Css ()
declaration Text
"line-break"

-- | CSS Property "line-height"
lineHeight
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
lineHeight :: Text -> Css ()
lineHeight = Text -> Text -> Css ()
declaration Text
"line-height"

-- | CSS Property "list-style"
listStyle
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
listStyle :: Text -> Css ()
listStyle = Text -> Text -> Css ()
declaration Text
"list-style"

-- | CSS Property "list-style-image"
listStyleImage
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
listStyleImage :: Text -> Css ()
listStyleImage = Text -> Text -> Css ()
declaration Text
"list-style-image"

-- | CSS Property "list-style-position"
listStylePosition
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
listStylePosition :: Text -> Css ()
listStylePosition = Text -> Text -> Css ()
declaration Text
"list-style-position"

-- | CSS Property "list-style-type"
listStyleType
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
listStyleType :: Text -> Css ()
listStyleType = Text -> Text -> Css ()
declaration Text
"list-style-type"

-- | CSS Property "margin"
margin
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
margin :: Text -> Css ()
margin = Text -> Text -> Css ()
declaration Text
"margin"

-- | CSS Property "margin-bottom"
marginBottom
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
marginBottom :: Text -> Css ()
marginBottom = Text -> Text -> Css ()
declaration Text
"margin-bottom"

-- | CSS Property "margin-left"
marginLeft
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
marginLeft :: Text -> Css ()
marginLeft = Text -> Text -> Css ()
declaration Text
"margin-left"

-- | CSS Property "margin-right"
marginRight
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
marginRight :: Text -> Css ()
marginRight = Text -> Text -> Css ()
declaration Text
"margin-right"

-- | CSS Property "margin-top"
marginTop
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
marginTop :: Text -> Css ()
marginTop = Text -> Text -> Css ()
declaration Text
"margin-top"

-- | CSS Property "mask"
mask
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
mask :: Text -> Css ()
mask = Text -> Text -> Css ()
declaration Text
"mask"

-- | CSS Property "mask-clip"
maskClip
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
maskClip :: Text -> Css ()
maskClip = Text -> Text -> Css ()
declaration Text
"mask-clip"

-- | CSS Property "mask-composite"
maskComposite
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
maskComposite :: Text -> Css ()
maskComposite = Text -> Text -> Css ()
declaration Text
"mask-composite"

-- | CSS Property "mask-image"
maskImage
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
maskImage :: Text -> Css ()
maskImage = Text -> Text -> Css ()
declaration Text
"mask-image"

-- | CSS Property "mask-mode"
maskMode
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
maskMode :: Text -> Css ()
maskMode = Text -> Text -> Css ()
declaration Text
"mask-mode"

-- | CSS Property "mask-origin"
maskOrigin
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
maskOrigin :: Text -> Css ()
maskOrigin = Text -> Text -> Css ()
declaration Text
"mask-origin"

-- | CSS Property "mask-position"
maskPosition
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
maskPosition :: Text -> Css ()
maskPosition = Text -> Text -> Css ()
declaration Text
"mask-position"

-- | CSS Property "mask-repeat"
maskRepeat
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
maskRepeat :: Text -> Css ()
maskRepeat = Text -> Text -> Css ()
declaration Text
"mask-repeat"

-- | CSS Property "mask-size"
maskSize
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
maskSize :: Text -> Css ()
maskSize = Text -> Text -> Css ()
declaration Text
"mask-size"

-- | CSS Property "mask-type"
maskType
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
maskType :: Text -> Css ()
maskType = Text -> Text -> Css ()
declaration Text
"mask-type"

-- | CSS Property "max-height"
maxHeight
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
maxHeight :: Text -> Css ()
maxHeight = Text -> Text -> Css ()
declaration Text
"max-height"

-- | CSS Property "max-width"
maxWidth
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
maxWidth :: Text -> Css ()
maxWidth = Text -> Text -> Css ()
declaration Text
"max-width"

-- | CSS Property "@media"
media
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
media :: Text -> Css ()
media = Text -> Text -> Css ()
declaration Text
"@media"

-- | CSS Property "min-height"
minHeight
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
minHeight :: Text -> Css ()
minHeight = Text -> Text -> Css ()
declaration Text
"min-height"

-- | CSS Property "min-width"
minWidth
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
minWidth :: Text -> Css ()
minWidth = Text -> Text -> Css ()
declaration Text
"min-width"

-- | CSS Property "mix-blend-mode"
mixBlendMode
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
mixBlendMode :: Text -> Css ()
mixBlendMode = Text -> Text -> Css ()
declaration Text
"mix-blend-mode"

-- | CSS Property "object-fit"
objectFit
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
objectFit :: Text -> Css ()
objectFit = Text -> Text -> Css ()
declaration Text
"object-fit"

-- | CSS Property "object-position"
objectPosition
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
objectPosition :: Text -> Css ()
objectPosition = Text -> Text -> Css ()
declaration Text
"object-position"

-- | CSS Property "opacity"
opacity
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
opacity :: Text -> Css ()
opacity = Text -> Text -> Css ()
declaration Text
"opacity"

-- | CSS Property "order"
order
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
order :: Text -> Css ()
order = Text -> Text -> Css ()
declaration Text
"order"

-- | CSS Property "orphans"
orphans
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
orphans :: Text -> Css ()
orphans = Text -> Text -> Css ()
declaration Text
"orphans"

-- | CSS Property "outline"
outline
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
outline :: Text -> Css ()
outline = Text -> Text -> Css ()
declaration Text
"outline"

-- | CSS Property "outline-color"
outlineColor
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
outlineColor :: Text -> Css ()
outlineColor = Text -> Text -> Css ()
declaration Text
"outline-color"

-- | CSS Property "outline-offset"
outlineOffset
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
outlineOffset :: Text -> Css ()
outlineOffset = Text -> Text -> Css ()
declaration Text
"outline-offset"

-- | CSS Property "outline-style"
outlineStyle
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
outlineStyle :: Text -> Css ()
outlineStyle = Text -> Text -> Css ()
declaration Text
"outline-style"

-- | CSS Property "outline-width"
outlineWidth
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
outlineWidth :: Text -> Css ()
outlineWidth = Text -> Text -> Css ()
declaration Text
"outline-width"

-- | CSS Property "overflow"
overflow
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
overflow :: Text -> Css ()
overflow = Text -> Text -> Css ()
declaration Text
"overflow"

-- | CSS Property "overflow-wrap"
overflowWrap
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
overflowWrap :: Text -> Css ()
overflowWrap = Text -> Text -> Css ()
declaration Text
"overflow-wrap"

-- | CSS Property "overflow-x"
overflowX
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
overflowX :: Text -> Css ()
overflowX = Text -> Text -> Css ()
declaration Text
"overflow-x"

-- | CSS Property "overflow-y"
overflowY
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
overflowY :: Text -> Css ()
overflowY = Text -> Text -> Css ()
declaration Text
"overflow-y"

-- | CSS Property "padding"
padding
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
padding :: Text -> Css ()
padding = Text -> Text -> Css ()
declaration Text
"padding"

-- | CSS Property "padding-bottom"
paddingBottom
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
paddingBottom :: Text -> Css ()
paddingBottom = Text -> Text -> Css ()
declaration Text
"padding-bottom"

-- | CSS Property "padding-left"
paddingLeft
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
paddingLeft :: Text -> Css ()
paddingLeft = Text -> Text -> Css ()
declaration Text
"padding-left"

-- | CSS Property "padding-right"
paddingRight
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
paddingRight :: Text -> Css ()
paddingRight = Text -> Text -> Css ()
declaration Text
"padding-right"

-- | CSS Property "padding-top"
paddingTop
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
paddingTop :: Text -> Css ()
paddingTop = Text -> Text -> Css ()
declaration Text
"padding-top"

-- | CSS Property "page-break-after"
pageBreakAfter
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
pageBreakAfter :: Text -> Css ()
pageBreakAfter = Text -> Text -> Css ()
declaration Text
"page-break-after"

-- | CSS Property "page-break-before"
pageBreakBefore
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
pageBreakBefore :: Text -> Css ()
pageBreakBefore = Text -> Text -> Css ()
declaration Text
"page-break-before"

-- | CSS Property "page-break-inside"
pageBreakInside
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
pageBreakInside :: Text -> Css ()
pageBreakInside = Text -> Text -> Css ()
declaration Text
"page-break-inside"

-- | CSS Property "perspective"
perspective
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
perspective :: Text -> Css ()
perspective = Text -> Text -> Css ()
declaration Text
"perspective"

-- | CSS Property "perspective-origin"
perspectiveOrigin
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
perspectiveOrigin :: Text -> Css ()
perspectiveOrigin = Text -> Text -> Css ()
declaration Text
"perspective-origin"

-- | CSS Property "pointer-events"
pointerEvents
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
pointerEvents :: Text -> Css ()
pointerEvents = Text -> Text -> Css ()
declaration Text
"pointer-events"

-- | CSS Property "position"
position
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
position :: Text -> Css ()
position = Text -> Text -> Css ()
declaration Text
"position"

-- | CSS Property "quotes"
quotes
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
quotes :: Text -> Css ()
quotes = Text -> Text -> Css ()
declaration Text
"quotes"

-- | CSS Property "resize"
resize
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
resize :: Text -> Css ()
resize = Text -> Text -> Css ()
declaration Text
"resize"

-- | CSS Property "right"
right
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
right :: Text -> Css ()
right = Text -> Text -> Css ()
declaration Text
"right"

-- | CSS Property "row-gap"
rowGap
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
rowGap :: Text -> Css ()
rowGap = Text -> Text -> Css ()
declaration Text
"row-gap"

-- | CSS Property "scroll-behavior"
scrollBehavior
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
scrollBehavior :: Text -> Css ()
scrollBehavior = Text -> Text -> Css ()
declaration Text
"scroll-behavior"

-- | CSS Property "tab-size"
tabSize
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
tabSize :: Text -> Css ()
tabSize = Text -> Text -> Css ()
declaration Text
"tab-size"

-- | CSS Property "table-layout"
tableLayout
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
tableLayout :: Text -> Css ()
tableLayout = Text -> Text -> Css ()
declaration Text
"table-layout"

-- | CSS Property "text-align"
textAlign
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
textAlign :: Text -> Css ()
textAlign = Text -> Text -> Css ()
declaration Text
"text-align"

-- | CSS Property "text-align-last"
textAlignLast
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
textAlignLast :: Text -> Css ()
textAlignLast = Text -> Text -> Css ()
declaration Text
"text-align-last"

-- | CSS Property "text-combine-upright"
textCombineUpright
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
textCombineUpright :: Text -> Css ()
textCombineUpright = Text -> Text -> Css ()
declaration Text
"text-combine-upright"

-- | CSS Property "text-decoration"
textDecoration
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
textDecoration :: Text -> Css ()
textDecoration = Text -> Text -> Css ()
declaration Text
"text-decoration"

-- | CSS Property "text-decoration-color"
textDecorationColor
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
textDecorationColor :: Text -> Css ()
textDecorationColor = Text -> Text -> Css ()
declaration Text
"text-decoration-color"

-- | CSS Property "text-decoration-line"
textDecorationLine
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
textDecorationLine :: Text -> Css ()
textDecorationLine = Text -> Text -> Css ()
declaration Text
"text-decoration-line"

-- | CSS Property "text-decoration-style"
textDecorationStyle
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
textDecorationStyle :: Text -> Css ()
textDecorationStyle = Text -> Text -> Css ()
declaration Text
"text-decoration-style"

-- | CSS Property "text-decoration-thickness"
textDecorationThickness
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
textDecorationThickness :: Text -> Css ()
textDecorationThickness = Text -> Text -> Css ()
declaration Text
"text-decoration-thickness"

-- | CSS Property "text-emphasis"
textEmphasis
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
textEmphasis :: Text -> Css ()
textEmphasis = Text -> Text -> Css ()
declaration Text
"text-emphasis"

-- | CSS Property "text-indent"
textIndent
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
textIndent :: Text -> Css ()
textIndent = Text -> Text -> Css ()
declaration Text
"text-indent"

-- | CSS Property "text-justify"
textJustify
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
textJustify :: Text -> Css ()
textJustify = Text -> Text -> Css ()
declaration Text
"text-justify"

-- | CSS Property "text-orientation"
textOrientation
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
textOrientation :: Text -> Css ()
textOrientation = Text -> Text -> Css ()
declaration Text
"text-orientation"

-- | CSS Property "text-overflow"
textOverflow
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
textOverflow :: Text -> Css ()
textOverflow = Text -> Text -> Css ()
declaration Text
"text-overflow"

-- | CSS Property "text-shadow"
textShadow
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
textShadow :: Text -> Css ()
textShadow = Text -> Text -> Css ()
declaration Text
"text-shadow"

-- | CSS Property "text-transform"
textTransform
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
textTransform :: Text -> Css ()
textTransform = Text -> Text -> Css ()
declaration Text
"text-transform"

-- | CSS Property "text-underline-position"
textUnderlinePosition
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
textUnderlinePosition :: Text -> Css ()
textUnderlinePosition = Text -> Text -> Css ()
declaration Text
"text-underline-position"

-- | CSS Property "top"
top
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
top :: Text -> Css ()
top = Text -> Text -> Css ()
declaration Text
"top"

-- | CSS Property "transform"
transform
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
transform :: Text -> Css ()
transform = Text -> Text -> Css ()
declaration Text
"transform"

-- | CSS Property "transform-origin"
transformOrigin
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
transformOrigin :: Text -> Css ()
transformOrigin = Text -> Text -> Css ()
declaration Text
"transform-origin"

-- | CSS Property "transform-style"
transformStyle
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
transformStyle :: Text -> Css ()
transformStyle = Text -> Text -> Css ()
declaration Text
"transform-style"

-- | CSS Property "transition"
transition
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
transition :: Text -> Css ()
transition = Text -> Text -> Css ()
declaration Text
"transition"

-- | CSS Property "transition-delay"
transitionDelay
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
transitionDelay :: Text -> Css ()
transitionDelay = Text -> Text -> Css ()
declaration Text
"transition-delay"

-- | CSS Property "transition-duration"
transitionDuration
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
transitionDuration :: Text -> Css ()
transitionDuration = Text -> Text -> Css ()
declaration Text
"transition-duration"

-- | CSS Property "transition-property"
transitionProperty
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
transitionProperty :: Text -> Css ()
transitionProperty = Text -> Text -> Css ()
declaration Text
"transition-property"

-- | CSS Property "transition-timing-function"
transitionTimingFunction
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
transitionTimingFunction :: Text -> Css ()
transitionTimingFunction = Text -> Text -> Css ()
declaration Text
"transition-timing-function"

-- | CSS Property "unicode-bidi"
unicodeBidi
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
unicodeBidi :: Text -> Css ()
unicodeBidi = Text -> Text -> Css ()
declaration Text
"unicode-bidi"

-- | CSS Property "user-select"
userSelect
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
userSelect :: Text -> Css ()
userSelect = Text -> Text -> Css ()
declaration Text
"user-select"

-- | CSS Property "vertical-align"
verticalAlign
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
verticalAlign :: Text -> Css ()
verticalAlign = Text -> Text -> Css ()
declaration Text
"vertical-align"

-- | CSS Property "visibility"
visibility
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
visibility :: Text -> Css ()
visibility = Text -> Text -> Css ()
declaration Text
"visibility"

-- | CSS Property "white-space"
whiteSpace
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
whiteSpace :: Text -> Css ()
whiteSpace = Text -> Text -> Css ()
declaration Text
"white-space"

-- | CSS Property "widows"
widows
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
widows :: Text -> Css ()
widows = Text -> Text -> Css ()
declaration Text
"widows"

-- | CSS Property "width"
width
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
width :: Text -> Css ()
width = Text -> Text -> Css ()
declaration Text
"width"

-- | CSS Property "word-break"
wordBreak
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
wordBreak :: Text -> Css ()
wordBreak = Text -> Text -> Css ()
declaration Text
"word-break"

-- | CSS Property "word-spacing"
wordSpacing
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
wordSpacing :: Text -> Css ()
wordSpacing = Text -> Text -> Css ()
declaration Text
"word-spacing"

-- | CSS Property "word-wrap"
wordWrap
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
wordWrap :: Text -> Css ()
wordWrap = Text -> Text -> Css ()
declaration Text
"word-wrap"

-- | CSS Property "writing-mode"
writingMode
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
writingMode :: Text -> Css ()
writingMode = Text -> Text -> Css ()
declaration Text
"writing-mode"

-- | CSS Property "z-index"
zIndex
    :: Text    -- ^ Value
    -> Css ()  -- ^ Return as CSS
zIndex :: Text -> Css ()
zIndex = Text -> Text -> Css ()
declaration Text
"z-index"