-- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:69 -- {-# LANGUAGE OverloadedStrings #-} -- | This module exports SVG combinators used to create documents. -- module Text.Blaze.Svg11 ( module Text.Blaze , module Text.Blaze.Svg , docType , docTypeSvg , 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 , fontFace , fontFaceFormat , fontFaceName , fontFaceSrc , fontFaceUri , foreignobject , g , glyph , glyphref , hkern , image , line , lineargradient , marker , mask , metadata , missingGlyph , mpath , path , pattern , polygon , polyline , radialgradient , rect , script , set , stop , style , svg , switch , symbol , text_ , textpath , title , tref , tspan , use , view , vkern ) where -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:78 -- import Prelude ((>>), (.), ($)) import Text.Blaze import Text.Blaze.Svg import Text.Blaze.Internal -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:157 -- -- | Combinator for the document type. This should be placed at the top -- of every SVG page. -- -- > -- > "http://www.w3.org/Graphics/SVG/1.1/DTD/svg11.dtd"> -- docType :: Svg -- ^ The document type SVG. docType = preEscapedText "\n\n" {-# INLINE docType #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:172 -- -- | Combinator for the @\@ element. This combinator will also -- insert the correct doctype. -- docTypeSvg :: Svg -- ^ Inner SVG. -> Svg -- ^ Resulting SVG. docTypeSvg inner = docType >> (svg ! attribute "xmlns" " xmlns=\"" "http://www.w3.org/2000/svg" ! attribute "xmlns:xlink" " xmlns:xlink=\"" "http://www.w3.org/1999/xlink" $ inner) {-# INLINE docTypeSvg #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:186 -- -- | Combinator for the @\@ element. -- a :: Svg -- ^ Inner SVG. -> Svg -- ^ Resulting SVG. a = Parent "a" "" {-# INLINE a #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- altglyph :: Svg -- ^ Resulting SVG. altglyph = Leaf "altGlyph" "" {-# INLINE altglyph #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- altglyphdef :: Svg -- ^ Resulting SVG. altglyphdef = Leaf "altGlyphDef" "" {-# INLINE altglyphdef #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- altglyphitem :: Svg -- ^ Resulting SVG. altglyphitem = Leaf "altGlyphItem" "" {-# INLINE altglyphitem #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- animate :: Svg -- ^ Resulting SVG. animate = Leaf "animate" "" {-# INLINE animate #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- animatecolor :: Svg -- ^ Resulting SVG. animatecolor = Leaf "animateColor" "" {-# INLINE animatecolor #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- animatemotion :: Svg -- ^ Resulting SVG. animatemotion = Leaf "animateMotion" "" {-# INLINE animatemotion #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- animatetransform :: Svg -- ^ Resulting SVG. animatetransform = Leaf "animateTransform" "" {-# INLINE animatetransform #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- circle :: Svg -- ^ Resulting SVG. circle = Leaf "circle" "" {-# INLINE circle #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:186 -- -- | Combinator for the @\@ element. -- clippath :: Svg -- ^ Inner SVG. -> Svg -- ^ Resulting SVG. clippath = Parent "clipPath" "" {-# INLINE clippath #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- colorProfile :: Svg -- ^ Resulting SVG. colorProfile = Leaf "color-profile" "" {-# INLINE colorProfile #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- cursor :: Svg -- ^ Resulting SVG. cursor = Leaf "cursor" "" {-# INLINE cursor #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:186 -- -- | Combinator for the @\@ element. -- defs :: Svg -- ^ Inner SVG. -> Svg -- ^ Resulting SVG. defs = Parent "defs" "" {-# INLINE defs #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- desc :: Svg -- ^ Resulting SVG. desc = Leaf "desc" "" {-# INLINE desc #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- ellipse :: Svg -- ^ Resulting SVG. ellipse = Leaf "ellipse" "" {-# INLINE ellipse #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- feblend :: Svg -- ^ Resulting SVG. feblend = Leaf "feBlend" "" {-# INLINE feblend #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- fecolormatrix :: Svg -- ^ Resulting SVG. fecolormatrix = Leaf "feColorMatrix" "" {-# INLINE fecolormatrix #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- fecomponenttransfer :: Svg -- ^ Resulting SVG. fecomponenttransfer = Leaf "feComponentTransfer" "" {-# INLINE fecomponenttransfer #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- fecomposite :: Svg -- ^ Resulting SVG. fecomposite = Leaf "feComposite" "" {-# INLINE fecomposite #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- feconvolvematrix :: Svg -- ^ Resulting SVG. feconvolvematrix = Leaf "feConvolveMatrix" "" {-# INLINE feconvolvematrix #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- fediffuselighting :: Svg -- ^ Resulting SVG. fediffuselighting = Leaf "feDiffuseLighting" "" {-# INLINE fediffuselighting #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- fedisplacementmap :: Svg -- ^ Resulting SVG. fedisplacementmap = Leaf "feDisplacementMap" "" {-# INLINE fedisplacementmap #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- fedistantlight :: Svg -- ^ Resulting SVG. fedistantlight = Leaf "feDistantLight" "" {-# INLINE fedistantlight #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- feflood :: Svg -- ^ Resulting SVG. feflood = Leaf "feFlood" "" {-# INLINE feflood #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- fefunca :: Svg -- ^ Resulting SVG. fefunca = Leaf "feFuncA" "" {-# INLINE fefunca #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- fefuncb :: Svg -- ^ Resulting SVG. fefuncb = Leaf "feFuncB" "" {-# INLINE fefuncb #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- fefuncg :: Svg -- ^ Resulting SVG. fefuncg = Leaf "feFuncG" "" {-# INLINE fefuncg #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- fefuncr :: Svg -- ^ Resulting SVG. fefuncr = Leaf "feFuncR" "" {-# INLINE fefuncr #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- fegaussianblur :: Svg -- ^ Resulting SVG. fegaussianblur = Leaf "feGaussianBlur" "" {-# INLINE fegaussianblur #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- feimage :: Svg -- ^ Resulting SVG. feimage = Leaf "feImage" "" {-# INLINE feimage #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- femerge :: Svg -- ^ Resulting SVG. femerge = Leaf "feMerge" "" {-# INLINE femerge #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- femergenode :: Svg -- ^ Resulting SVG. femergenode = Leaf "feMergeNode" "" {-# INLINE femergenode #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- femorphology :: Svg -- ^ Resulting SVG. femorphology = Leaf "feMorphology" "" {-# INLINE femorphology #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- feoffset :: Svg -- ^ Resulting SVG. feoffset = Leaf "feOffset" "" {-# INLINE feoffset #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- fepointlight :: Svg -- ^ Resulting SVG. fepointlight = Leaf "fePointLight" "" {-# INLINE fepointlight #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- fespecularlighting :: Svg -- ^ Resulting SVG. fespecularlighting = Leaf "feSpecularLighting" "" {-# INLINE fespecularlighting #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- fespotlight :: Svg -- ^ Resulting SVG. fespotlight = Leaf "feSpotLight" "" {-# INLINE fespotlight #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- fetile :: Svg -- ^ Resulting SVG. fetile = Leaf "feTile" "" {-# INLINE fetile #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- feturbulence :: Svg -- ^ Resulting SVG. feturbulence = Leaf "feTurbulence" "" {-# INLINE feturbulence #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- filter_ :: Svg -- ^ Resulting SVG. filter_ = Leaf "filter" "" {-# INLINE filter_ #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- font :: Svg -- ^ Resulting SVG. font = Leaf "font" "" {-# INLINE font #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- fontFace :: Svg -- ^ Resulting SVG. fontFace = Leaf "font-face" "" {-# INLINE fontFace #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- fontFaceFormat :: Svg -- ^ Resulting SVG. fontFaceFormat = Leaf "font-face-format" "" {-# INLINE fontFaceFormat #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- fontFaceName :: Svg -- ^ Resulting SVG. fontFaceName = Leaf "font-face-name" "" {-# INLINE fontFaceName #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- fontFaceSrc :: Svg -- ^ Resulting SVG. fontFaceSrc = Leaf "font-face-src" "" {-# INLINE fontFaceSrc #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- fontFaceUri :: Svg -- ^ Resulting SVG. fontFaceUri = Leaf "font-face-uri" "" {-# INLINE fontFaceUri #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- foreignobject :: Svg -- ^ Resulting SVG. foreignobject = Leaf "foreignObject" "" {-# INLINE foreignobject #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:186 -- -- | Combinator for the @\@ element. -- g :: Svg -- ^ Inner SVG. -> Svg -- ^ Resulting SVG. g = Parent "g" "" {-# INLINE g #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:186 -- -- | Combinator for the @\@ element. -- glyph :: Svg -- ^ Inner SVG. -> Svg -- ^ Resulting SVG. glyph = Parent "glyph" "" {-# INLINE glyph #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- glyphref :: Svg -- ^ Resulting SVG. glyphref = Leaf "glyphRef" "" {-# INLINE glyphref #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- hkern :: Svg -- ^ Resulting SVG. hkern = Leaf "hkern" "" {-# INLINE hkern #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- image :: Svg -- ^ Resulting SVG. image = Leaf "image" "" {-# INLINE image #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- line :: Svg -- ^ Resulting SVG. line = Leaf "line" "" {-# INLINE line #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:186 -- -- | Combinator for the @\@ element. -- lineargradient :: Svg -- ^ Inner SVG. -> Svg -- ^ Resulting SVG. lineargradient = Parent "linearGradient" "" {-# INLINE lineargradient #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:186 -- -- | Combinator for the @\@ element. -- marker :: Svg -- ^ Inner SVG. -> Svg -- ^ Resulting SVG. marker = Parent "marker" "" {-# INLINE marker #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:186 -- -- | Combinator for the @\@ element. -- mask :: Svg -- ^ Inner SVG. -> Svg -- ^ Resulting SVG. mask = Parent "mask" "" {-# INLINE mask #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- metadata :: Svg -- ^ Resulting SVG. metadata = Leaf "metadata" "" {-# INLINE metadata #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:186 -- -- | Combinator for the @\@ element. -- missingGlyph :: Svg -- ^ Inner SVG. -> Svg -- ^ Resulting SVG. missingGlyph = Parent "missing-glyph" "" {-# INLINE missingGlyph #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- mpath :: Svg -- ^ Resulting SVG. mpath = Leaf "mpath" "" {-# INLINE mpath #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- path :: Svg -- ^ Resulting SVG. path = Leaf "path" "" {-# INLINE path #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:186 -- -- | Combinator for the @\@ element. -- pattern :: Svg -- ^ Inner SVG. -> Svg -- ^ Resulting SVG. pattern = Parent "pattern" "" {-# INLINE pattern #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- polygon :: Svg -- ^ Resulting SVG. polygon = Leaf "polygon" "" {-# INLINE polygon #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- polyline :: Svg -- ^ Resulting SVG. polyline = Leaf "polyline" "" {-# INLINE polyline #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:186 -- -- | Combinator for the @\@ element. -- radialgradient :: Svg -- ^ Inner SVG. -> Svg -- ^ Resulting SVG. radialgradient = Parent "radialGradient" "" {-# INLINE radialgradient #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- rect :: Svg -- ^ Resulting SVG. rect = Leaf "rect" "" {-# INLINE rect #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- script :: Svg -- ^ Resulting SVG. script = Leaf "script" "" {-# INLINE script #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- set :: Svg -- ^ Resulting SVG. set = Leaf "set" "" {-# INLINE set #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- stop :: Svg -- ^ Resulting SVG. stop = Leaf "stop" "" {-# INLINE stop #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- style :: Svg -- ^ Resulting SVG. style = Leaf "style" "" {-# INLINE style #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:186 -- -- | Combinator for the @\@ element. -- svg :: Svg -- ^ Inner SVG. -> Svg -- ^ Resulting SVG. svg = Parent "svg" "" {-# INLINE svg #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:186 -- -- | Combinator for the @\@ element. -- switch :: Svg -- ^ Inner SVG. -> Svg -- ^ Resulting SVG. switch = Parent "switch" "" {-# INLINE switch #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:186 -- -- | Combinator for the @\@ element. -- symbol :: Svg -- ^ Inner SVG. -> Svg -- ^ Resulting SVG. symbol = Parent "symbol" "" {-# INLINE symbol #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:186 -- -- | Combinator for the @\@ element. -- text_ :: Svg -- ^ Inner SVG. -> Svg -- ^ Resulting SVG. text_ = Parent "text" "" {-# INLINE text_ #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- textpath :: Svg -- ^ Resulting SVG. textpath = Leaf "textPath" "" {-# INLINE textpath #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- title :: Svg -- ^ Resulting SVG. title = Leaf "title" "" {-# INLINE title #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- tref :: Svg -- ^ Resulting SVG. tref = Leaf "tref" "" {-# INLINE tref #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- tspan :: Svg -- ^ Resulting SVG. tspan = Leaf "tspan" "" {-# INLINE tspan #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- use :: Svg -- ^ Resulting SVG. use = Leaf "use" "" {-# INLINE use #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- view :: Svg -- ^ Resulting SVG. view = Leaf "view" "" {-# INLINE view #-} -- WARNING: The next block of code was automatically generated by -- src/Util/GenerateSvgCombinators.hs:205 -- -- | Combinator for the @\@ element. -- vkern :: Svg -- ^ Resulting SVG. vkern = Leaf "vkern" "" {-# INLINE vkern #-}