module Miso.Svg.Element
(
svg_
, foreignObject_
, circle_
, ellipse_
, image_
, line_
, path_
, polygon_
, polyline_
, rect_
, use_
, animate_
, animateColor_
, animateMotion_
, animateTransform_
, mpath_
, set_
, desc_
, metadata_
, title_
, a_
, defs_
, g_
, marker_
, mask_
, missingGlyph_
, pattern_
, switch_
, symbol_
, altGlyph_
, altGlyphDef_
, altGlyphItem_
, glyph_
, glyphRef_
, textPath_
, text_
, tref_
, tspan_
, font_
, fontFace_
, fontFaceFormat_
, fontFaceName_
, fontFaceSrc_
, fontFaceUri_
, hkern_
, vkern_
, linearGradient_
, radialGradient_
, stop_
, feBlend_
, feColorMatrix_
, feComponentTransfer_
, feComposite_
, feConvolveMatrix_
, feDiffuseLighting_
, feDisplacementMap_
, feFlood_
, feFuncA_
, feFuncB_
, feFuncG_
, feFuncR_
, feGaussianBlur_
, feImage_
, feMerge_
, feMergeNode_
, feMorhpology_
, feOffset_
, feSpecularLighting_
, feTile_
, feTurbulence_
, feDistantLight_
, fePointLight_
, feSpotLight_
, clipPath_
, colorProfile_
, cursor_
, filter_
, script_
, style_
, view_
) where
import Miso.Html.Internal hiding (style_)
import Miso.String (MisoString)
import qualified Prelude as P
nodeSvg_ :: MisoString -> [Attribute action] -> [View action] -> View action
nodeSvg_ = P.flip (node SVG) P.Nothing
svg_ :: [Attribute action] -> [View action] -> View action
svg_ = nodeSvg_ "svg"
foreignObject_ :: [Attribute action] -> [View action] -> View action
foreignObject_ = nodeSvg_ "foreignObject"
circle_ :: [Attribute action] -> [View action] -> View action
circle_ = nodeSvg_ "circle"
ellipse_ :: [Attribute action] -> [View action] -> View action
ellipse_ = nodeSvg_ "ellipse"
image_ :: [Attribute action] -> [View action] -> View action
image_ = nodeSvg_ "image"
line_ :: [Attribute action] -> [View action] -> View action
line_ = nodeSvg_ "line"
path_ :: [Attribute action] -> [View action] -> View action
path_ = nodeSvg_ "path"
polygon_ :: [Attribute action] -> [View action] -> View action
polygon_ = nodeSvg_ "polygon"
polyline_ :: [Attribute action] -> [View action] -> View action
polyline_ = nodeSvg_ "polyline"
rect_ :: [Attribute action] -> [View action] -> View action
rect_ = nodeSvg_ "rect"
use_ :: [Attribute action] -> [View action] -> View action
use_ = nodeSvg_ "use"
animate_ :: [Attribute action] -> [View action] -> View action
animate_ = nodeSvg_ "animate"
animateColor_ :: [Attribute action] -> [View action] -> View action
animateColor_ = nodeSvg_ "animateColor"
animateMotion_ :: [Attribute action] -> [View action] -> View action
animateMotion_ = nodeSvg_ "animateMotion"
animateTransform_ :: [Attribute action] -> [View action] -> View action
animateTransform_ = nodeSvg_ "animateTransform"
mpath_ :: [Attribute action] -> [View action] -> View action
mpath_ = nodeSvg_ "mpath"
set_ :: [Attribute action] -> [View action] -> View action
set_ = nodeSvg_ "set"
desc_ :: [Attribute action] -> [View action] -> View action
desc_ = nodeSvg_ "desc"
metadata_ :: [Attribute action] -> [View action] -> View action
metadata_ = nodeSvg_ "metadata"
title_ :: [Attribute action] -> [View action] -> View action
title_ = nodeSvg_ "title"
a_ :: [Attribute action] -> [View action] -> View action
a_ = nodeSvg_ "a"
defs_ :: [Attribute action] -> [View action] -> View action
defs_ = nodeSvg_ "defs"
g_ :: [Attribute action] -> [View action] -> View action
g_ = nodeSvg_ "g"
marker_ :: [Attribute action] -> [View action] -> View action
marker_ = nodeSvg_ "marker"
mask_ :: [Attribute action] -> [View action] -> View action
mask_ = nodeSvg_ "mask"
missingGlyph_ :: [Attribute action] -> [View action] -> View action
missingGlyph_ = nodeSvg_ "missingGlyph"
pattern_ :: [Attribute action] -> [View action] -> View action
pattern_ = nodeSvg_ "pattern"
switch_ :: [Attribute action] -> [View action] -> View action
switch_ = nodeSvg_ "switch"
symbol_ :: [Attribute action] -> [View action] -> View action
symbol_ = nodeSvg_ "symbol"
altGlyph_ :: [Attribute action] -> [View action] -> View action
altGlyph_ = nodeSvg_ "altGlyph"
altGlyphDef_ :: [Attribute action] -> [View action] -> View action
altGlyphDef_ = nodeSvg_ "altGlyphDef"
altGlyphItem_ :: [Attribute action] -> [View action] -> View action
altGlyphItem_ = nodeSvg_ "altGlyphItem"
glyph_ :: [Attribute action] -> [View action] -> View action
glyph_ = nodeSvg_ "glyph"
glyphRef_ :: [Attribute action] -> [View action] -> View action
glyphRef_ = nodeSvg_ "glyphRef"
textPath_ :: [Attribute action] -> [View action] -> View action
textPath_ = nodeSvg_ "textPath"
text_ :: [Attribute action] -> [View action] -> View action
text_ = nodeSvg_ "text"
tref_ :: [Attribute action] -> [View action] -> View action
tref_ = nodeSvg_ "tref"
tspan_ :: [Attribute action] -> [View action] -> View action
tspan_ = nodeSvg_ "tspan"
font_ :: [Attribute action] -> [View action] -> View action
font_ = nodeSvg_ "font"
fontFace_ :: [Attribute action] -> [View action] -> View action
fontFace_ = nodeSvg_ "font-face"
fontFaceFormat_ :: [Attribute action] -> [View action] -> View action
fontFaceFormat_ = nodeSvg_ "font-face-format"
fontFaceName_ :: [Attribute action] -> [View action] -> View action
fontFaceName_ = nodeSvg_ "font-face-name"
fontFaceSrc_ :: [Attribute action] -> [View action] -> View action
fontFaceSrc_ = nodeSvg_ "font-face-src"
fontFaceUri_ :: [Attribute action] -> [View action] -> View action
fontFaceUri_ = nodeSvg_ "font-face-uri"
hkern_ :: [Attribute action] -> [View action] -> View action
hkern_ = nodeSvg_ "hkern"
vkern_ :: [Attribute action] -> [View action] -> View action
vkern_ = nodeSvg_ "vkern"
linearGradient_ :: [Attribute action] -> [View action] -> View action
linearGradient_ = nodeSvg_ "linearGradient"
radialGradient_ :: [Attribute action] -> [View action] -> View action
radialGradient_ = nodeSvg_ "radialGradient"
stop_ :: [Attribute action] -> [View action] -> View action
stop_ = nodeSvg_ "stop"
feBlend_ :: [Attribute action] -> [View action] -> View action
feBlend_ = nodeSvg_ "feBlend"
feColorMatrix_ :: [Attribute action] -> [View action] -> View action
feColorMatrix_ = nodeSvg_ "feColorMatrix"
feComponentTransfer_ :: [Attribute action] -> [View action] -> View action
feComponentTransfer_ = nodeSvg_ "feComponentTransfer"
feComposite_ :: [Attribute action] -> [View action] -> View action
feComposite_ = nodeSvg_ "feComposite"
feConvolveMatrix_ :: [Attribute action] -> [View action] -> View action
feConvolveMatrix_ = nodeSvg_ "feConvolveMatrix"
feDiffuseLighting_ :: [Attribute action] -> [View action] -> View action
feDiffuseLighting_ = nodeSvg_ "feDiffuseLighting"
feDisplacementMap_ :: [Attribute action] -> [View action] -> View action
feDisplacementMap_ = nodeSvg_ "feDisplacementMap"
feFlood_ :: [Attribute action] -> [View action] -> View action
feFlood_ = nodeSvg_ "feFlood"
feFuncA_ :: [Attribute action] -> [View action] -> View action
feFuncA_ = nodeSvg_ "feFuncA"
feFuncB_ :: [Attribute action] -> [View action] -> View action
feFuncB_ = nodeSvg_ "feFuncB"
feFuncG_ :: [Attribute action] -> [View action] -> View action
feFuncG_ = nodeSvg_ "feFuncG"
feFuncR_ :: [Attribute action] -> [View action] -> View action
feFuncR_ = nodeSvg_ "feFuncR"
feGaussianBlur_ :: [Attribute action] -> [View action] -> View action
feGaussianBlur_ = nodeSvg_ "feGaussianBlur"
feImage_ :: [Attribute action] -> [View action] -> View action
feImage_ = nodeSvg_ "feImage"
feMerge_ :: [Attribute action] -> [View action] -> View action
feMerge_ = nodeSvg_ "feMerge"
feMergeNode_ :: [Attribute action] -> [View action] -> View action
feMergeNode_ = nodeSvg_ "feMergeNode"
feMorhpology_ :: [Attribute action] -> [View action] -> View action
feMorhpology_ = nodeSvg_ "feMorhpology"
feOffset_ :: [Attribute action] -> [View action] -> View action
feOffset_ = nodeSvg_ "feOffset"
feSpecularLighting_ :: [Attribute action] -> [View action] -> View action
feSpecularLighting_ = nodeSvg_ "feSpecularLighting"
feTile_ :: [Attribute action] -> [View action] -> View action
feTile_ = nodeSvg_ "feTile"
feTurbulence_ :: [Attribute action] -> [View action] -> View action
feTurbulence_ = nodeSvg_ "feTurbulence"
feDistantLight_ :: [Attribute action] -> [View action] -> View action
feDistantLight_ = nodeSvg_ "feDistantLight"
fePointLight_ :: [Attribute action] -> [View action] -> View action
fePointLight_ = nodeSvg_ "fePointLight"
feSpotLight_ :: [Attribute action] -> [View action] -> View action
feSpotLight_ = nodeSvg_ "feSpotLight"
clipPath_ :: [Attribute action] -> [View action] -> View action
clipPath_ = nodeSvg_ "clipPath"
colorProfile_ :: [Attribute action] -> [View action] -> View action
colorProfile_ = nodeSvg_ "color-profile"
cursor_ :: [Attribute action] -> [View action] -> View action
cursor_ = nodeSvg_ "cursor"
filter_ :: [Attribute action] -> [View action] -> View action
filter_ = nodeSvg_ "filter"
script_ :: [Attribute action] -> [View action] -> View action
script_ = nodeSvg_ "script"
style_ :: [Attribute action] -> [View action] -> View action
style_ = nodeSvg_ "style"
view_ :: [Attribute action] -> [View action] -> View action
view_ = nodeSvg_ "view"