-- | 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 "cx" " cx=\""

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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

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