-- | This module exports combinators that provide you with the
-- ability to set attributes on SVG elements.
--
{-# LANGUAGE OverloadedStrings #-}
module Text.Blaze.Front.Svg.Attributes
    ( cx
    , cy
    , d
    , dx
    , dy
    , fill
    , fillOpacity
    , fontFamily
    , fontSize
    , fx
    , fy
    , gradientTransform
    , gradientUnits
    , markerEnd
    , markerMid
    , markerStart
    , offset
    , opacity
    , patternContentUnits
    , patternUnits
    , points
    , preserveAspectRatio
    , r
    , rx
    , ry
    , spreadMethod
    , stopColor
    , stopOpacity
    , stroke
    , strokeDasharray
    , strokeLinecap
    , strokeOpacity
    , strokeWidth
    , textAnchor
    , transform
    , version
    , viewBox
    , x1
    , x2
    , x
    , y1
    , y2
    , y
    ) where

import Text.Blaze.Front.Internal (Attribute, AttributeValue, attribute)

cx :: AttributeValue -> Attribute ev
cx :: AttributeValue -> Attribute ev
cx = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"cx" Tag
" cx=\""

cy :: AttributeValue -> Attribute ev
cy :: AttributeValue -> Attribute ev
cy = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"cy" Tag
" cy=\""

d :: AttributeValue -> Attribute ev
d :: AttributeValue -> Attribute ev
d = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"d" Tag
" d=\""

dx :: AttributeValue -> Attribute ev
dx :: AttributeValue -> Attribute ev
dx = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"dx" Tag
" dx=\""

dy :: AttributeValue -> Attribute ev
dy :: AttributeValue -> Attribute ev
dy = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"dy" Tag
" dy=\""

fill :: AttributeValue -> Attribute ev
fill :: AttributeValue -> Attribute ev
fill = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"fill" Tag
" fill=\""

fillOpacity :: AttributeValue -> Attribute ev
fillOpacity :: AttributeValue -> Attribute ev
fillOpacity = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"fillOpacity" Tag
" fillOpacity=\""

fontFamily :: AttributeValue -> Attribute ev
fontFamily :: AttributeValue -> Attribute ev
fontFamily = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"fontFamily" Tag
" fontFamily=\""

fontSize :: AttributeValue -> Attribute ev
fontSize :: AttributeValue -> Attribute ev
fontSize = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"fontSize" Tag
" fontSize=\""

fx :: AttributeValue -> Attribute ev
fx :: AttributeValue -> Attribute ev
fx = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"fx" Tag
" fx=\""

fy :: AttributeValue -> Attribute ev
fy :: AttributeValue -> Attribute ev
fy = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"fy" Tag
" fy=\""

gradientTransform :: AttributeValue -> Attribute ev
gradientTransform :: AttributeValue -> Attribute ev
gradientTransform = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"gradientTransform" Tag
" gradientTransform=\""

gradientUnits :: AttributeValue -> Attribute ev
gradientUnits :: AttributeValue -> Attribute ev
gradientUnits = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"gradientUnits" Tag
" gradientUnits=\""

markerEnd :: AttributeValue -> Attribute ev
markerEnd :: AttributeValue -> Attribute ev
markerEnd = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"markerEnd" Tag
" markerEnd=\""

markerMid :: AttributeValue -> Attribute ev
markerMid :: AttributeValue -> Attribute ev
markerMid = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"markerMid" Tag
" markerMid=\""

markerStart :: AttributeValue -> Attribute ev
markerStart :: AttributeValue -> Attribute ev
markerStart = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"markerStart" Tag
" markerStart=\""

offset :: AttributeValue -> Attribute ev
offset :: AttributeValue -> Attribute ev
offset = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"offset" Tag
" offset=\""

opacity :: AttributeValue -> Attribute ev
opacity :: AttributeValue -> Attribute ev
opacity = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"opacity" Tag
" opacity=\""

patternContentUnits :: AttributeValue -> Attribute ev
patternContentUnits :: AttributeValue -> Attribute ev
patternContentUnits = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"patternContentUnits" Tag
" patternContentUnits=\""

patternUnits :: AttributeValue -> Attribute ev
patternUnits :: AttributeValue -> Attribute ev
patternUnits = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"patternUnits" Tag
" patternUnits=\""

points :: AttributeValue -> Attribute ev
points :: AttributeValue -> Attribute ev
points = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"points" Tag
" points=\""

preserveAspectRatio :: AttributeValue -> Attribute ev
preserveAspectRatio :: AttributeValue -> Attribute ev
preserveAspectRatio = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"preserveAspectRatio" Tag
" preserveAspectRatio=\""

r :: AttributeValue -> Attribute ev
r :: AttributeValue -> Attribute ev
r = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"r" Tag
" r=\""

rx :: AttributeValue -> Attribute ev
rx :: AttributeValue -> Attribute ev
rx = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"rx" Tag
" rx=\""

ry :: AttributeValue -> Attribute ev
ry :: AttributeValue -> Attribute ev
ry = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"ry" Tag
" ry=\""

spreadMethod :: AttributeValue -> Attribute ev
spreadMethod :: AttributeValue -> Attribute ev
spreadMethod = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"spreadMethod" Tag
" spreadMethod=\""

stopColor :: AttributeValue -> Attribute ev
stopColor :: AttributeValue -> Attribute ev
stopColor = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"stopColor" Tag
" stopColor=\""

stopOpacity :: AttributeValue -> Attribute ev
stopOpacity :: AttributeValue -> Attribute ev
stopOpacity = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"stopOpacity" Tag
" stopOpacity=\""

stroke :: AttributeValue -> Attribute ev
stroke :: AttributeValue -> Attribute ev
stroke = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"stroke" Tag
" stroke=\""

strokeDasharray :: AttributeValue -> Attribute ev
strokeDasharray :: AttributeValue -> Attribute ev
strokeDasharray = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"strokeDasharray" Tag
" strokeDasharray=\""

strokeLinecap :: AttributeValue -> Attribute ev
strokeLinecap :: AttributeValue -> Attribute ev
strokeLinecap = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"strokeLinecap" Tag
" strokeLinecap=\""

strokeOpacity :: AttributeValue -> Attribute ev
strokeOpacity :: AttributeValue -> Attribute ev
strokeOpacity = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"strokeOpacity" Tag
" strokeOpacity=\""

strokeWidth :: AttributeValue -> Attribute ev
strokeWidth :: AttributeValue -> Attribute ev
strokeWidth = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"strokeWidth" Tag
" strokeWidth=\""

textAnchor :: AttributeValue -> Attribute ev
textAnchor :: AttributeValue -> Attribute ev
textAnchor = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"textAnchor" Tag
" textAnchor=\""

transform :: AttributeValue -> Attribute ev
transform :: AttributeValue -> Attribute ev
transform = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"transform" Tag
" transform=\""

version :: AttributeValue -> Attribute ev
version :: AttributeValue -> Attribute ev
version = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"version" Tag
" version=\""

viewBox :: AttributeValue -> Attribute ev
viewBox :: AttributeValue -> Attribute ev
viewBox = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"viewBox" Tag
" viewBox=\""

x1 :: AttributeValue -> Attribute ev
x1 :: AttributeValue -> Attribute ev
x1 = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"x1" Tag
" x1=\""

x2 :: AttributeValue -> Attribute ev
x2 :: AttributeValue -> Attribute ev
x2 = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"x2" Tag
" x2=\""

x :: AttributeValue -> Attribute ev
x :: AttributeValue -> Attribute ev
x = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"x" Tag
" x=\""

y1 :: AttributeValue -> Attribute ev
y1 :: AttributeValue -> Attribute ev
y1 = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"y1" Tag
" y1=\""

y2 :: AttributeValue -> Attribute ev
y2 :: AttributeValue -> Attribute ev
y2 = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"y2" Tag
" y2=\""

y :: AttributeValue -> Attribute ev
y :: AttributeValue -> Attribute ev
y = Tag -> Tag -> AttributeValue -> Attribute ev
forall ev. Tag -> Tag -> AttributeValue -> Attribute ev
attribute Tag
"y" Tag
" y=\""