module Graphics.UI.Threepenny.SVG.Elements (
    -- * Synopsis
    -- | SVG elements as defined by W3C, Scalable Vector Graphics (SVG) 1.1
    --   (Second Edition) Appendix M <http://www.w3.org/TR/2011/REC-SVG11-20110816/>.
    -- 
    -- Whenever possible, the Haskell identifier for an element is the 
    -- same as the attribute name. However, sometimes changes are necessary:
    --
    --     1. Hyphens @-@ are replaced by underscores @_@, e.g. 'font_face'.

    -- * SVG Elements
    a, altGlyph, altGlyphDef, altGlyphItem,
    animate, animateColor, animateMotion, animateTransform,
    circle, clipPath, colorProfile, cursor,
    defs, desc,
    ellipse,
    feBlend, feColorMatrix, feComponentTransfer, feComposite, feConvolveMatrix,
    feDiffuseLighting, feDisplacementMap, feDistantLight, feFlood,
    feFuncA, feFuncB, feFuncG, feFuncR,
    feGaussianBlur, feImage, feMerge, feMergeNode, feMorphology, feOffset,
    fePointLight, feSpecularLighting, feSpotLight, feTile, feTurbulence,
    filter, font,
    font_face, font_face_format, font_face_name, font_face_srv, font_face_uri,
    foreignObject,
    g, glyph, glyphRef,
    hkern,
    image,
    line, linearGradient,
    marker, mask, metadata, missing_glyph, mpath,
    path, pattern, polygon, polyline,
    radialGradient, rect,
    script, set, stop, style, svg, switch, symbol,
    text, textPath, title, tref, tspan,
    use,
    view, vkern,
    ) where

import Prelude (Maybe(..))
import Graphics.UI.Threepenny.Core (mkElementNamespace)


tag :: String -> UI Element
tag    = Maybe String -> String -> UI Element
mkElementNamespace (forall a. a -> Maybe a
Just String
"http://www.w3.org/2000/svg")
itag :: String -> UI Element
itag   = String -> UI Element
tag

a :: UI Element
a                     =  String -> UI Element
tag String
"a"
altGlyph :: UI Element
altGlyph              =  String -> UI Element
tag String
"altGlyph"
altGlyphDef :: UI Element
altGlyphDef           = String -> UI Element
itag String
"altGlyphDef"
altGlyphItem :: UI Element
altGlyphItem          = String -> UI Element
itag String
"altGlyphItem"
animate :: UI Element
animate               =  String -> UI Element
tag String
"animate"
animateColor :: UI Element
animateColor          =  String -> UI Element
tag String
"animateColor"
animateMotion :: UI Element
animateMotion         =  String -> UI Element
tag String
"animateMotion"
animateTransform :: UI Element
animateTransform      = String -> UI Element
itag String
"animateTransform"
circle :: UI Element
circle                = String -> UI Element
itag String
"circle"
clipPath :: UI Element
clipPath              =  String -> UI Element
tag String
"clipPath"
colorProfile :: UI Element
colorProfile          = String -> UI Element
itag String
"colorProfile"
cursor :: UI Element
cursor                = String -> UI Element
itag String
"cursor"
defs :: UI Element
defs                  =  String -> UI Element
tag String
"defs"
desc :: UI Element
desc                  = String -> UI Element
itag String
"desc"
ellipse :: UI Element
ellipse               =  String -> UI Element
tag String
"ellipse"
feBlend :: UI Element
feBlend               =  String -> UI Element
tag String
"feBlend"
feColorMatrix :: UI Element
feColorMatrix         =  String -> UI Element
tag String
"feColorMatrix"
feComponentTransfer :: UI Element
feComponentTransfer   =  String -> UI Element
tag String
"feComponentTransfer"
feComposite :: UI Element
feComposite           =  String -> UI Element
tag String
"feComposite"
feConvolveMatrix :: UI Element
feConvolveMatrix      =  String -> UI Element
tag String
"feConvolveMatrix"
feDiffuseLighting :: UI Element
feDiffuseLighting     =  String -> UI Element
tag String
"feDiffuseLighting"
feDisplacementMap :: UI Element
feDisplacementMap     =  String -> UI Element
tag String
"feDisplacementMap"
feDistantLight :: UI Element
feDistantLight        = String -> UI Element
itag String
"feDistantLight"
feFlood :: UI Element
feFlood               =  String -> UI Element
tag String
"feFlood"
feFuncA :: UI Element
feFuncA               = String -> UI Element
itag String
"feFuncA"
feFuncB :: UI Element
feFuncB               = String -> UI Element
itag String
"feFuncB"
feFuncG :: UI Element
feFuncG               = String -> UI Element
itag String
"feFuncG"
feFuncR :: UI Element
feFuncR               = String -> UI Element
itag String
"feFuncR"
feGaussianBlur :: UI Element
feGaussianBlur        =  String -> UI Element
tag String
"feGaussianBlur"
feImage :: UI Element
feImage               =  String -> UI Element
tag String
"feImage"
feMerge :: UI Element
feMerge               =  String -> UI Element
tag String
"feMerge"
feMergeNode :: UI Element
feMergeNode           = String -> UI Element
itag String
"feMergeNode"
feMorphology :: UI Element
feMorphology          =  String -> UI Element
tag String
"feMorphology"
feOffset :: UI Element
feOffset              =  String -> UI Element
tag String
"feOffset"
fePointLight :: UI Element
fePointLight          = String -> UI Element
itag String
"fePointLight"
feSpecularLighting :: UI Element
feSpecularLighting    =  String -> UI Element
tag String
"feSpecularLighting"
feSpotLight :: UI Element
feSpotLight           = String -> UI Element
itag String
"feSpotLight"
feTile :: UI Element
feTile                =  String -> UI Element
tag String
"feTile"
feTurbulence :: UI Element
feTurbulence          =  String -> UI Element
tag String
"feTurbulence"
filter :: UI Element
filter                =  String -> UI Element
tag String
"filter"
font :: UI Element
font                  =  String -> UI Element
tag String
"font"
font_face :: UI Element
font_face             = String -> UI Element
itag String
"font-face"
font_face_format :: UI Element
font_face_format      = String -> UI Element
itag String
"font-face-format"
font_face_name :: UI Element
font_face_name        = String -> UI Element
itag String
"font-face-name"
font_face_srv :: UI Element
font_face_srv         = String -> UI Element
itag String
"font-face-src"
font_face_uri :: UI Element
font_face_uri         = String -> UI Element
itag String
"font-face-uri"
foreignObject :: UI Element
foreignObject         =  String -> UI Element
tag String
"foreignObject"
g :: UI Element
g                     =  String -> UI Element
tag String
"g"
glyph :: UI Element
glyph                 =  String -> UI Element
tag String
"glyph"
glyphRef :: UI Element
glyphRef              =  String -> UI Element
tag String
"glyphRef"
hkern :: UI Element
hkern                 = String -> UI Element
itag String
"hkern"
image :: UI Element
image                 =  String -> UI Element
tag String
"image"
line :: UI Element
line                  =  String -> UI Element
tag String
"line"
linearGradient :: UI Element
linearGradient        =  String -> UI Element
tag String
"linearGradient"
marker :: UI Element
marker                =  String -> UI Element
tag String
"marker"
mask :: UI Element
mask                  =  String -> UI Element
tag String
"mask"
metadata :: UI Element
metadata              = String -> UI Element
itag String
"metadata"
missing_glyph :: UI Element
missing_glyph         =  String -> UI Element
tag String
"missing-glyph"
mpath :: UI Element
mpath                 = String -> UI Element
itag String
"mpath"
path :: UI Element
path                  = String -> UI Element
itag String
"path"
pattern :: UI Element
pattern               =  String -> UI Element
tag String
"pattern"
polygon :: UI Element
polygon               =  String -> UI Element
tag String
"polygon"
polyline :: UI Element
polyline              =  String -> UI Element
tag String
"polyline"
radialGradient :: UI Element
radialGradient        =  String -> UI Element
tag String
"radialGradient"
rect :: UI Element
rect                  =  String -> UI Element
tag String
"rect"
script :: UI Element
script                = String -> UI Element
itag String
"script"
set :: UI Element
set                   = String -> UI Element
itag String
"set"
stop :: UI Element
stop                  =  String -> UI Element
tag String
"stop"
style :: UI Element
style                 = String -> UI Element
itag String
"style"
svg :: UI Element
svg                   =  String -> UI Element
tag String
"svg"
switch :: UI Element
switch                =  String -> UI Element
tag String
"switch"
symbol :: UI Element
symbol                =  String -> UI Element
tag String
"symbol"
text :: UI Element
text                  =  String -> UI Element
tag String
"text"
textPath :: UI Element
textPath              =  String -> UI Element
tag String
"textPath"
title :: UI Element
title                 = String -> UI Element
itag String
"title"
tref :: UI Element
tref                  =  String -> UI Element
tag String
"tref"
tspan :: UI Element
tspan                 =  String -> UI Element
tag String
"tspan"
use :: UI Element
use                   =  String -> UI Element
tag String
"use"
view :: UI Element
view                  = String -> UI Element
itag String
"view"
vkern :: UI Element
vkern                 = String -> UI Element
itag String
"vkern"