1-- WARNING: The next block of code was automatically generated by
2-- src/Util/GenerateHtmlCombinators.hs:69
3--
4{-# LANGUAGE OverloadedStrings #-}
5-- | This module exports HTML combinators used to create documents.
6--
7module Text.Blaze.Html4.FrameSet
8    ( module Text.Blaze.Html
9    , docType
10    , docTypeHtml
11    , a
12    , abbr
13    , acronym
14    , address
15    , applet
16    , area
17    , b
18    , basefont
19    , bdo
20    , big
21    , blockquote
22    , body
23    , br
24    , button
25    , caption
26    , center
27    , cite
28    , code
29    , col
30    , colgroup
31    , dd
32    , del
33    , dfn
34    , dir
35    , div
36    , dl
37    , dt
38    , em
39    , fieldset
40    , font
41    , form
42    , frame
43    , frameset
44    , h1
45    , h2
46    , h3
47    , h4
48    , h5
49    , h6
50    , head
51    , hr
52    , html
53    , i
54    , iframe
55    , img
56    , input
57    , ins
58    , isindex
59    , kbd
60    , label
61    , legend
62    , li
63    , link
64    , map
65    , menu
66    , meta
67    , noframes
68    , noscript
69    , object
70    , ol
71    , optgroup
72    , option
73    , p
74    , param
75    , pre
76    , q
77    , s
78    , samp
79    , script
80    , select
81    , small
82    , span
83    , strong
84    , style
85    , sub
86    , sup
87    , table
88    , tbody
89    , td
90    , textarea
91    , tfoot
92    , th
93    , thead
94    , title
95    , tr
96    , tt
97    , u
98    , ul
99    , var
100    ) where
101
102-- WARNING: The next block of code was automatically generated by
103-- src/Util/GenerateHtmlCombinators.hs:77
104--
105import Prelude ((>>), (.))
106
107import Text.Blaze
108import Text.Blaze.Internal
109import Text.Blaze.Html
110
111-- WARNING: The next block of code was automatically generated by
112-- src/Util/GenerateHtmlCombinators.hs:156
113--
114-- | Combinator for the document type. This should be placed at the top
115-- of every HTML page.
116--
117-- Example:
118--
119-- > docType
120--
121-- Result:
122--
123-- > <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.01 FrameSet//EN"
124-- >     "http://www.w3.org/TR/html4/frameset.dtd">
125--
126docType :: Html  -- ^ The document type HTML.
127docType = preEscapedText "<!DOCTYPE HTML PUBLIC \"-//W3C//DTD HTML 4.01 FrameSet//EN\"\n    \"http://www.w3.org/TR/html4/frameset.dtd\">\n"
128{-# INLINE docType #-}
129
130-- WARNING: The next block of code was automatically generated by
131-- src/Util/GenerateHtmlCombinators.hs:177
132--
133-- | Combinator for the @\<html>@ element. This combinator will also
134-- insert the correct doctype.
135--
136-- Example:
137--
138-- > docTypeHtml $ span $ toHtml "foo"
139--
140-- Result:
141--
142-- > <!DOCTYPE HTML PUBLIC "-//W3C//DTD HTML 4.01 FrameSet//EN"
143-- >     "http://www.w3.org/TR/html4/frameset.dtd">
144-- > <html><span>foo</span></html>
145--
146docTypeHtml :: Html  -- ^ Inner HTML.
147            -> Html  -- ^ Resulting HTML.
148docTypeHtml inner = docType >> html inner
149{-# INLINE docTypeHtml #-}
150
151-- WARNING: The next block of code was automatically generated by
152-- src/Util/GenerateHtmlCombinators.hs:199
153--
154-- | Combinator for the @\<a>@ element.
155--
156-- Example:
157--
158-- > a $ span $ toHtml "foo"
159--
160-- Result:
161--
162-- > <a><span>foo</span></a>
163--
164a :: Html  -- ^ Inner HTML.
165  -> Html  -- ^ Resulting HTML.
166a = Parent "a" "<a" "</a>"
167{-# INLINE a #-}
168
169-- WARNING: The next block of code was automatically generated by
170-- src/Util/GenerateHtmlCombinators.hs:199
171--
172-- | Combinator for the @\<abbr>@ element.
173--
174-- Example:
175--
176-- > abbr $ span $ toHtml "foo"
177--
178-- Result:
179--
180-- > <abbr><span>foo</span></abbr>
181--
182abbr :: Html  -- ^ Inner HTML.
183     -> Html  -- ^ Resulting HTML.
184abbr = Parent "abbr" "<abbr" "</abbr>"
185{-# INLINE abbr #-}
186
187-- WARNING: The next block of code was automatically generated by
188-- src/Util/GenerateHtmlCombinators.hs:199
189--
190-- | Combinator for the @\<acronym>@ element.
191--
192-- Example:
193--
194-- > acronym $ span $ toHtml "foo"
195--
196-- Result:
197--
198-- > <acronym><span>foo</span></acronym>
199--
200acronym :: Html  -- ^ Inner HTML.
201        -> Html  -- ^ Resulting HTML.
202acronym = Parent "acronym" "<acronym" "</acronym>"
203{-# INLINE acronym #-}
204
205-- WARNING: The next block of code was automatically generated by
206-- src/Util/GenerateHtmlCombinators.hs:199
207--
208-- | Combinator for the @\<address>@ element.
209--
210-- Example:
211--
212-- > address $ span $ toHtml "foo"
213--
214-- Result:
215--
216-- > <address><span>foo</span></address>
217--
218address :: Html  -- ^ Inner HTML.
219        -> Html  -- ^ Resulting HTML.
220address = Parent "address" "<address" "</address>"
221{-# INLINE address #-}
222
223-- WARNING: The next block of code was automatically generated by
224-- src/Util/GenerateHtmlCombinators.hs:199
225--
226-- | Combinator for the @\<applet>@ element.
227--
228-- Example:
229--
230-- > applet $ span $ toHtml "foo"
231--
232-- Result:
233--
234-- > <applet><span>foo</span></applet>
235--
236applet :: Html  -- ^ Inner HTML.
237       -> Html  -- ^ Resulting HTML.
238applet = Parent "applet" "<applet" "</applet>"
239{-# INLINE applet #-}
240
241-- WARNING: The next block of code was automatically generated by
242-- src/Util/GenerateHtmlCombinators.hs:226
243--
244-- | Combinator for the @\<area />@ element.
245--
246-- Example:
247--
248-- > area
249--
250-- Result:
251--
252-- > <area />
253--
254area :: Html  -- ^ Resulting HTML.
255area = Leaf "area" "<area" ">" ()
256{-# INLINE area #-}
257
258-- WARNING: The next block of code was automatically generated by
259-- src/Util/GenerateHtmlCombinators.hs:199
260--
261-- | Combinator for the @\<b>@ element.
262--
263-- Example:
264--
265-- > b $ span $ toHtml "foo"
266--
267-- Result:
268--
269-- > <b><span>foo</span></b>
270--
271b :: Html  -- ^ Inner HTML.
272  -> Html  -- ^ Resulting HTML.
273b = Parent "b" "<b" "</b>"
274{-# INLINE b #-}
275
276-- WARNING: The next block of code was automatically generated by
277-- src/Util/GenerateHtmlCombinators.hs:226
278--
279-- | Combinator for the @\<basefont />@ element.
280--
281-- Example:
282--
283-- > basefont
284--
285-- Result:
286--
287-- > <basefont />
288--
289basefont :: Html  -- ^ Resulting HTML.
290basefont = Leaf "basefont" "<basefont" ">" ()
291{-# INLINE basefont #-}
292
293-- WARNING: The next block of code was automatically generated by
294-- src/Util/GenerateHtmlCombinators.hs:199
295--
296-- | Combinator for the @\<bdo>@ element.
297--
298-- Example:
299--
300-- > bdo $ span $ toHtml "foo"
301--
302-- Result:
303--
304-- > <bdo><span>foo</span></bdo>
305--
306bdo :: Html  -- ^ Inner HTML.
307    -> Html  -- ^ Resulting HTML.
308bdo = Parent "bdo" "<bdo" "</bdo>"
309{-# INLINE bdo #-}
310
311-- WARNING: The next block of code was automatically generated by
312-- src/Util/GenerateHtmlCombinators.hs:199
313--
314-- | Combinator for the @\<big>@ element.
315--
316-- Example:
317--
318-- > big $ span $ toHtml "foo"
319--
320-- Result:
321--
322-- > <big><span>foo</span></big>
323--
324big :: Html  -- ^ Inner HTML.
325    -> Html  -- ^ Resulting HTML.
326big = Parent "big" "<big" "</big>"
327{-# INLINE big #-}
328
329-- WARNING: The next block of code was automatically generated by
330-- src/Util/GenerateHtmlCombinators.hs:199
331--
332-- | Combinator for the @\<blockquote>@ element.
333--
334-- Example:
335--
336-- > blockquote $ span $ toHtml "foo"
337--
338-- Result:
339--
340-- > <blockquote><span>foo</span></blockquote>
341--
342blockquote :: Html  -- ^ Inner HTML.
343           -> Html  -- ^ Resulting HTML.
344blockquote = Parent "blockquote" "<blockquote" "</blockquote>"
345{-# INLINE blockquote #-}
346
347-- WARNING: The next block of code was automatically generated by
348-- src/Util/GenerateHtmlCombinators.hs:199
349--
350-- | Combinator for the @\<body>@ element.
351--
352-- Example:
353--
354-- > body $ span $ toHtml "foo"
355--
356-- Result:
357--
358-- > <body><span>foo</span></body>
359--
360body :: Html  -- ^ Inner HTML.
361     -> Html  -- ^ Resulting HTML.
362body = Parent "body" "<body" "</body>"
363{-# INLINE body #-}
364
365-- WARNING: The next block of code was automatically generated by
366-- src/Util/GenerateHtmlCombinators.hs:226
367--
368-- | Combinator for the @\<br />@ element.
369--
370-- Example:
371--
372-- > br
373--
374-- Result:
375--
376-- > <br />
377--
378br :: Html  -- ^ Resulting HTML.
379br = Leaf "br" "<br" ">" ()
380{-# INLINE br #-}
381
382-- WARNING: The next block of code was automatically generated by
383-- src/Util/GenerateHtmlCombinators.hs:199
384--
385-- | Combinator for the @\<button>@ element.
386--
387-- Example:
388--
389-- > button $ span $ toHtml "foo"
390--
391-- Result:
392--
393-- > <button><span>foo</span></button>
394--
395button :: Html  -- ^ Inner HTML.
396       -> Html  -- ^ Resulting HTML.
397button = Parent "button" "<button" "</button>"
398{-# INLINE button #-}
399
400-- WARNING: The next block of code was automatically generated by
401-- src/Util/GenerateHtmlCombinators.hs:199
402--
403-- | Combinator for the @\<caption>@ element.
404--
405-- Example:
406--
407-- > caption $ span $ toHtml "foo"
408--
409-- Result:
410--
411-- > <caption><span>foo</span></caption>
412--
413caption :: Html  -- ^ Inner HTML.
414        -> Html  -- ^ Resulting HTML.
415caption = Parent "caption" "<caption" "</caption>"
416{-# INLINE caption #-}
417
418-- WARNING: The next block of code was automatically generated by
419-- src/Util/GenerateHtmlCombinators.hs:199
420--
421-- | Combinator for the @\<center>@ element.
422--
423-- Example:
424--
425-- > center $ span $ toHtml "foo"
426--
427-- Result:
428--
429-- > <center><span>foo</span></center>
430--
431center :: Html  -- ^ Inner HTML.
432       -> Html  -- ^ Resulting HTML.
433center = Parent "center" "<center" "</center>"
434{-# INLINE center #-}
435
436-- WARNING: The next block of code was automatically generated by
437-- src/Util/GenerateHtmlCombinators.hs:199
438--
439-- | Combinator for the @\<cite>@ element.
440--
441-- Example:
442--
443-- > cite $ span $ toHtml "foo"
444--
445-- Result:
446--
447-- > <cite><span>foo</span></cite>
448--
449cite :: Html  -- ^ Inner HTML.
450     -> Html  -- ^ Resulting HTML.
451cite = Parent "cite" "<cite" "</cite>"
452{-# INLINE cite #-}
453
454-- WARNING: The next block of code was automatically generated by
455-- src/Util/GenerateHtmlCombinators.hs:199
456--
457-- | Combinator for the @\<code>@ element.
458--
459-- Example:
460--
461-- > code $ span $ toHtml "foo"
462--
463-- Result:
464--
465-- > <code><span>foo</span></code>
466--
467code :: Html  -- ^ Inner HTML.
468     -> Html  -- ^ Resulting HTML.
469code = Parent "code" "<code" "</code>"
470{-# INLINE code #-}
471
472-- WARNING: The next block of code was automatically generated by
473-- src/Util/GenerateHtmlCombinators.hs:226
474--
475-- | Combinator for the @\<col />@ element.
476--
477-- Example:
478--
479-- > col
480--
481-- Result:
482--
483-- > <col />
484--
485col :: Html  -- ^ Resulting HTML.
486col = Leaf "col" "<col" ">" ()
487{-# INLINE col #-}
488
489-- WARNING: The next block of code was automatically generated by
490-- src/Util/GenerateHtmlCombinators.hs:199
491--
492-- | Combinator for the @\<colgroup>@ element.
493--
494-- Example:
495--
496-- > colgroup $ span $ toHtml "foo"
497--
498-- Result:
499--
500-- > <colgroup><span>foo</span></colgroup>
501--
502colgroup :: Html  -- ^ Inner HTML.
503         -> Html  -- ^ Resulting HTML.
504colgroup = Parent "colgroup" "<colgroup" "</colgroup>"
505{-# INLINE colgroup #-}
506
507-- WARNING: The next block of code was automatically generated by
508-- src/Util/GenerateHtmlCombinators.hs:199
509--
510-- | Combinator for the @\<dd>@ element.
511--
512-- Example:
513--
514-- > dd $ span $ toHtml "foo"
515--
516-- Result:
517--
518-- > <dd><span>foo</span></dd>
519--
520dd :: Html  -- ^ Inner HTML.
521   -> Html  -- ^ Resulting HTML.
522dd = Parent "dd" "<dd" "</dd>"
523{-# INLINE dd #-}
524
525-- WARNING: The next block of code was automatically generated by
526-- src/Util/GenerateHtmlCombinators.hs:199
527--
528-- | Combinator for the @\<del>@ element.
529--
530-- Example:
531--
532-- > del $ span $ toHtml "foo"
533--
534-- Result:
535--
536-- > <del><span>foo</span></del>
537--
538del :: Html  -- ^ Inner HTML.
539    -> Html  -- ^ Resulting HTML.
540del = Parent "del" "<del" "</del>"
541{-# INLINE del #-}
542
543-- WARNING: The next block of code was automatically generated by
544-- src/Util/GenerateHtmlCombinators.hs:199
545--
546-- | Combinator for the @\<dfn>@ element.
547--
548-- Example:
549--
550-- > dfn $ span $ toHtml "foo"
551--
552-- Result:
553--
554-- > <dfn><span>foo</span></dfn>
555--
556dfn :: Html  -- ^ Inner HTML.
557    -> Html  -- ^ Resulting HTML.
558dfn = Parent "dfn" "<dfn" "</dfn>"
559{-# INLINE dfn #-}
560
561-- WARNING: The next block of code was automatically generated by
562-- src/Util/GenerateHtmlCombinators.hs:199
563--
564-- | Combinator for the @\<dir>@ element.
565--
566-- Example:
567--
568-- > dir $ span $ toHtml "foo"
569--
570-- Result:
571--
572-- > <dir><span>foo</span></dir>
573--
574dir :: Html  -- ^ Inner HTML.
575    -> Html  -- ^ Resulting HTML.
576dir = Parent "dir" "<dir" "</dir>"
577{-# INLINE dir #-}
578
579-- WARNING: The next block of code was automatically generated by
580-- src/Util/GenerateHtmlCombinators.hs:199
581--
582-- | Combinator for the @\<div>@ element.
583--
584-- Example:
585--
586-- > div $ span $ toHtml "foo"
587--
588-- Result:
589--
590-- > <div><span>foo</span></div>
591--
592div :: Html  -- ^ Inner HTML.
593    -> Html  -- ^ Resulting HTML.
594div = Parent "div" "<div" "</div>"
595{-# INLINE div #-}
596
597-- WARNING: The next block of code was automatically generated by
598-- src/Util/GenerateHtmlCombinators.hs:199
599--
600-- | Combinator for the @\<dl>@ element.
601--
602-- Example:
603--
604-- > dl $ span $ toHtml "foo"
605--
606-- Result:
607--
608-- > <dl><span>foo</span></dl>
609--
610dl :: Html  -- ^ Inner HTML.
611   -> Html  -- ^ Resulting HTML.
612dl = Parent "dl" "<dl" "</dl>"
613{-# INLINE dl #-}
614
615-- WARNING: The next block of code was automatically generated by
616-- src/Util/GenerateHtmlCombinators.hs:199
617--
618-- | Combinator for the @\<dt>@ element.
619--
620-- Example:
621--
622-- > dt $ span $ toHtml "foo"
623--
624-- Result:
625--
626-- > <dt><span>foo</span></dt>
627--
628dt :: Html  -- ^ Inner HTML.
629   -> Html  -- ^ Resulting HTML.
630dt = Parent "dt" "<dt" "</dt>"
631{-# INLINE dt #-}
632
633-- WARNING: The next block of code was automatically generated by
634-- src/Util/GenerateHtmlCombinators.hs:199
635--
636-- | Combinator for the @\<em>@ element.
637--
638-- Example:
639--
640-- > em $ span $ toHtml "foo"
641--
642-- Result:
643--
644-- > <em><span>foo</span></em>
645--
646em :: Html  -- ^ Inner HTML.
647   -> Html  -- ^ Resulting HTML.
648em = Parent "em" "<em" "</em>"
649{-# INLINE em #-}
650
651-- WARNING: The next block of code was automatically generated by
652-- src/Util/GenerateHtmlCombinators.hs:199
653--
654-- | Combinator for the @\<fieldset>@ element.
655--
656-- Example:
657--
658-- > fieldset $ span $ toHtml "foo"
659--
660-- Result:
661--
662-- > <fieldset><span>foo</span></fieldset>
663--
664fieldset :: Html  -- ^ Inner HTML.
665         -> Html  -- ^ Resulting HTML.
666fieldset = Parent "fieldset" "<fieldset" "</fieldset>"
667{-# INLINE fieldset #-}
668
669-- WARNING: The next block of code was automatically generated by
670-- src/Util/GenerateHtmlCombinators.hs:199
671--
672-- | Combinator for the @\<font>@ element.
673--
674-- Example:
675--
676-- > font $ span $ toHtml "foo"
677--
678-- Result:
679--
680-- > <font><span>foo</span></font>
681--
682font :: Html  -- ^ Inner HTML.
683     -> Html  -- ^ Resulting HTML.
684font = Parent "font" "<font" "</font>"
685{-# INLINE font #-}
686
687-- WARNING: The next block of code was automatically generated by
688-- src/Util/GenerateHtmlCombinators.hs:199
689--
690-- | Combinator for the @\<form>@ element.
691--
692-- Example:
693--
694-- > form $ span $ toHtml "foo"
695--
696-- Result:
697--
698-- > <form><span>foo</span></form>
699--
700form :: Html  -- ^ Inner HTML.
701     -> Html  -- ^ Resulting HTML.
702form = Parent "form" "<form" "</form>"
703{-# INLINE form #-}
704
705-- WARNING: The next block of code was automatically generated by
706-- src/Util/GenerateHtmlCombinators.hs:226
707--
708-- | Combinator for the @\<frame />@ element.
709--
710-- Example:
711--
712-- > frame
713--
714-- Result:
715--
716-- > <frame />
717--
718frame :: Html  -- ^ Resulting HTML.
719frame = Leaf "frame" "<frame" ">" ()
720{-# INLINE frame #-}
721
722-- WARNING: The next block of code was automatically generated by
723-- src/Util/GenerateHtmlCombinators.hs:199
724--
725-- | Combinator for the @\<frameset>@ element.
726--
727-- Example:
728--
729-- > frameset $ span $ toHtml "foo"
730--
731-- Result:
732--
733-- > <frameset><span>foo</span></frameset>
734--
735frameset :: Html  -- ^ Inner HTML.
736         -> Html  -- ^ Resulting HTML.
737frameset = Parent "frameset" "<frameset" "</frameset>"
738{-# INLINE frameset #-}
739
740-- WARNING: The next block of code was automatically generated by
741-- src/Util/GenerateHtmlCombinators.hs:199
742--
743-- | Combinator for the @\<h1>@ element.
744--
745-- Example:
746--
747-- > h1 $ span $ toHtml "foo"
748--
749-- Result:
750--
751-- > <h1><span>foo</span></h1>
752--
753h1 :: Html  -- ^ Inner HTML.
754   -> Html  -- ^ Resulting HTML.
755h1 = Parent "h1" "<h1" "</h1>"
756{-# INLINE h1 #-}
757
758-- WARNING: The next block of code was automatically generated by
759-- src/Util/GenerateHtmlCombinators.hs:199
760--
761-- | Combinator for the @\<h2>@ element.
762--
763-- Example:
764--
765-- > h2 $ span $ toHtml "foo"
766--
767-- Result:
768--
769-- > <h2><span>foo</span></h2>
770--
771h2 :: Html  -- ^ Inner HTML.
772   -> Html  -- ^ Resulting HTML.
773h2 = Parent "h2" "<h2" "</h2>"
774{-# INLINE h2 #-}
775
776-- WARNING: The next block of code was automatically generated by
777-- src/Util/GenerateHtmlCombinators.hs:199
778--
779-- | Combinator for the @\<h3>@ element.
780--
781-- Example:
782--
783-- > h3 $ span $ toHtml "foo"
784--
785-- Result:
786--
787-- > <h3><span>foo</span></h3>
788--
789h3 :: Html  -- ^ Inner HTML.
790   -> Html  -- ^ Resulting HTML.
791h3 = Parent "h3" "<h3" "</h3>"
792{-# INLINE h3 #-}
793
794-- WARNING: The next block of code was automatically generated by
795-- src/Util/GenerateHtmlCombinators.hs:199
796--
797-- | Combinator for the @\<h4>@ element.
798--
799-- Example:
800--
801-- > h4 $ span $ toHtml "foo"
802--
803-- Result:
804--
805-- > <h4><span>foo</span></h4>
806--
807h4 :: Html  -- ^ Inner HTML.
808   -> Html  -- ^ Resulting HTML.
809h4 = Parent "h4" "<h4" "</h4>"
810{-# INLINE h4 #-}
811
812-- WARNING: The next block of code was automatically generated by
813-- src/Util/GenerateHtmlCombinators.hs:199
814--
815-- | Combinator for the @\<h5>@ element.
816--
817-- Example:
818--
819-- > h5 $ span $ toHtml "foo"
820--
821-- Result:
822--
823-- > <h5><span>foo</span></h5>
824--
825h5 :: Html  -- ^ Inner HTML.
826   -> Html  -- ^ Resulting HTML.
827h5 = Parent "h5" "<h5" "</h5>"
828{-# INLINE h5 #-}
829
830-- WARNING: The next block of code was automatically generated by
831-- src/Util/GenerateHtmlCombinators.hs:199
832--
833-- | Combinator for the @\<h6>@ element.
834--
835-- Example:
836--
837-- > h6 $ span $ toHtml "foo"
838--
839-- Result:
840--
841-- > <h6><span>foo</span></h6>
842--
843h6 :: Html  -- ^ Inner HTML.
844   -> Html  -- ^ Resulting HTML.
845h6 = Parent "h6" "<h6" "</h6>"
846{-# INLINE h6 #-}
847
848-- WARNING: The next block of code was automatically generated by
849-- src/Util/GenerateHtmlCombinators.hs:199
850--
851-- | Combinator for the @\<head>@ element.
852--
853-- Example:
854--
855-- > head $ span $ toHtml "foo"
856--
857-- Result:
858--
859-- > <head><span>foo</span></head>
860--
861head :: Html  -- ^ Inner HTML.
862     -> Html  -- ^ Resulting HTML.
863head = Parent "head" "<head" "</head>"
864{-# INLINE head #-}
865
866-- WARNING: The next block of code was automatically generated by
867-- src/Util/GenerateHtmlCombinators.hs:226
868--
869-- | Combinator for the @\<hr />@ element.
870--
871-- Example:
872--
873-- > hr
874--
875-- Result:
876--
877-- > <hr />
878--
879hr :: Html  -- ^ Resulting HTML.
880hr = Leaf "hr" "<hr" ">" ()
881{-# INLINE hr #-}
882
883-- WARNING: The next block of code was automatically generated by
884-- src/Util/GenerateHtmlCombinators.hs:199
885--
886-- | Combinator for the @\<html>@ element.
887--
888-- Example:
889--
890-- > html $ span $ toHtml "foo"
891--
892-- Result:
893--
894-- > <html><span>foo</span></html>
895--
896html :: Html  -- ^ Inner HTML.
897     -> Html  -- ^ Resulting HTML.
898html = Parent "html" "<html" "</html>"
899{-# INLINE html #-}
900
901-- WARNING: The next block of code was automatically generated by
902-- src/Util/GenerateHtmlCombinators.hs:199
903--
904-- | Combinator for the @\<i>@ element.
905--
906-- Example:
907--
908-- > i $ span $ toHtml "foo"
909--
910-- Result:
911--
912-- > <i><span>foo</span></i>
913--
914i :: Html  -- ^ Inner HTML.
915  -> Html  -- ^ Resulting HTML.
916i = Parent "i" "<i" "</i>"
917{-# INLINE i #-}
918
919-- WARNING: The next block of code was automatically generated by
920-- src/Util/GenerateHtmlCombinators.hs:199
921--
922-- | Combinator for the @\<iframe>@ element.
923--
924-- Example:
925--
926-- > iframe $ span $ toHtml "foo"
927--
928-- Result:
929--
930-- > <iframe><span>foo</span></iframe>
931--
932iframe :: Html  -- ^ Inner HTML.
933       -> Html  -- ^ Resulting HTML.
934iframe = Parent "iframe" "<iframe" "</iframe>"
935{-# INLINE iframe #-}
936
937-- WARNING: The next block of code was automatically generated by
938-- src/Util/GenerateHtmlCombinators.hs:226
939--
940-- | Combinator for the @\<img />@ element.
941--
942-- Example:
943--
944-- > img
945--
946-- Result:
947--
948-- > <img />
949--
950img :: Html  -- ^ Resulting HTML.
951img = Leaf "img" "<img" ">" ()
952{-# INLINE img #-}
953
954-- WARNING: The next block of code was automatically generated by
955-- src/Util/GenerateHtmlCombinators.hs:226
956--
957-- | Combinator for the @\<input />@ element.
958--
959-- Example:
960--
961-- > input
962--
963-- Result:
964--
965-- > <input />
966--
967input :: Html  -- ^ Resulting HTML.
968input = Leaf "input" "<input" ">" ()
969{-# INLINE input #-}
970
971-- WARNING: The next block of code was automatically generated by
972-- src/Util/GenerateHtmlCombinators.hs:199
973--
974-- | Combinator for the @\<ins>@ element.
975--
976-- Example:
977--
978-- > ins $ span $ toHtml "foo"
979--
980-- Result:
981--
982-- > <ins><span>foo</span></ins>
983--
984ins :: Html  -- ^ Inner HTML.
985    -> Html  -- ^ Resulting HTML.
986ins = Parent "ins" "<ins" "</ins>"
987{-# INLINE ins #-}
988
989-- WARNING: The next block of code was automatically generated by
990-- src/Util/GenerateHtmlCombinators.hs:199
991--
992-- | Combinator for the @\<isindex>@ element.
993--
994-- Example:
995--
996-- > isindex $ span $ toHtml "foo"
997--
998-- Result:
999--
1000-- > <isindex><span>foo</span></isindex>
1001--
1002isindex :: Html  -- ^ Inner HTML.
1003        -> Html  -- ^ Resulting HTML.
1004isindex = Parent "isindex" "<isindex" "</isindex>"
1005{-# INLINE isindex #-}
1006
1007-- WARNING: The next block of code was automatically generated by
1008-- src/Util/GenerateHtmlCombinators.hs:199
1009--
1010-- | Combinator for the @\<kbd>@ element.
1011--
1012-- Example:
1013--
1014-- > kbd $ span $ toHtml "foo"
1015--
1016-- Result:
1017--
1018-- > <kbd><span>foo</span></kbd>
1019--
1020kbd :: Html  -- ^ Inner HTML.
1021    -> Html  -- ^ Resulting HTML.
1022kbd = Parent "kbd" "<kbd" "</kbd>"
1023{-# INLINE kbd #-}
1024
1025-- WARNING: The next block of code was automatically generated by
1026-- src/Util/GenerateHtmlCombinators.hs:199
1027--
1028-- | Combinator for the @\<label>@ element.
1029--
1030-- Example:
1031--
1032-- > label $ span $ toHtml "foo"
1033--
1034-- Result:
1035--
1036-- > <label><span>foo</span></label>
1037--
1038label :: Html  -- ^ Inner HTML.
1039      -> Html  -- ^ Resulting HTML.
1040label = Parent "label" "<label" "</label>"
1041{-# INLINE label #-}
1042
1043-- WARNING: The next block of code was automatically generated by
1044-- src/Util/GenerateHtmlCombinators.hs:199
1045--
1046-- | Combinator for the @\<legend>@ element.
1047--
1048-- Example:
1049--
1050-- > legend $ span $ toHtml "foo"
1051--
1052-- Result:
1053--
1054-- > <legend><span>foo</span></legend>
1055--
1056legend :: Html  -- ^ Inner HTML.
1057       -> Html  -- ^ Resulting HTML.
1058legend = Parent "legend" "<legend" "</legend>"
1059{-# INLINE legend #-}
1060
1061-- WARNING: The next block of code was automatically generated by
1062-- src/Util/GenerateHtmlCombinators.hs:199
1063--
1064-- | Combinator for the @\<li>@ element.
1065--
1066-- Example:
1067--
1068-- > li $ span $ toHtml "foo"
1069--
1070-- Result:
1071--
1072-- > <li><span>foo</span></li>
1073--
1074li :: Html  -- ^ Inner HTML.
1075   -> Html  -- ^ Resulting HTML.
1076li = Parent "li" "<li" "</li>"
1077{-# INLINE li #-}
1078
1079-- WARNING: The next block of code was automatically generated by
1080-- src/Util/GenerateHtmlCombinators.hs:226
1081--
1082-- | Combinator for the @\<link />@ element.
1083--
1084-- Example:
1085--
1086-- > link
1087--
1088-- Result:
1089--
1090-- > <link />
1091--
1092link :: Html  -- ^ Resulting HTML.
1093link = Leaf "link" "<link" ">" ()
1094{-# INLINE link #-}
1095
1096-- WARNING: The next block of code was automatically generated by
1097-- src/Util/GenerateHtmlCombinators.hs:199
1098--
1099-- | Combinator for the @\<map>@ element.
1100--
1101-- Example:
1102--
1103-- > map $ span $ toHtml "foo"
1104--
1105-- Result:
1106--
1107-- > <map><span>foo</span></map>
1108--
1109map :: Html  -- ^ Inner HTML.
1110    -> Html  -- ^ Resulting HTML.
1111map = Parent "map" "<map" "</map>"
1112{-# INLINE map #-}
1113
1114-- WARNING: The next block of code was automatically generated by
1115-- src/Util/GenerateHtmlCombinators.hs:199
1116--
1117-- | Combinator for the @\<menu>@ element.
1118--
1119-- Example:
1120--
1121-- > menu $ span $ toHtml "foo"
1122--
1123-- Result:
1124--
1125-- > <menu><span>foo</span></menu>
1126--
1127menu :: Html  -- ^ Inner HTML.
1128     -> Html  -- ^ Resulting HTML.
1129menu = Parent "menu" "<menu" "</menu>"
1130{-# INLINE menu #-}
1131
1132-- WARNING: The next block of code was automatically generated by
1133-- src/Util/GenerateHtmlCombinators.hs:226
1134--
1135-- | Combinator for the @\<meta />@ element.
1136--
1137-- Example:
1138--
1139-- > meta
1140--
1141-- Result:
1142--
1143-- > <meta />
1144--
1145meta :: Html  -- ^ Resulting HTML.
1146meta = Leaf "meta" "<meta" ">" ()
1147{-# INLINE meta #-}
1148
1149-- WARNING: The next block of code was automatically generated by
1150-- src/Util/GenerateHtmlCombinators.hs:199
1151--
1152-- | Combinator for the @\<noframes>@ element.
1153--
1154-- Example:
1155--
1156-- > noframes $ span $ toHtml "foo"
1157--
1158-- Result:
1159--
1160-- > <noframes><span>foo</span></noframes>
1161--
1162noframes :: Html  -- ^ Inner HTML.
1163         -> Html  -- ^ Resulting HTML.
1164noframes = Parent "noframes" "<noframes" "</noframes>"
1165{-# INLINE noframes #-}
1166
1167-- WARNING: The next block of code was automatically generated by
1168-- src/Util/GenerateHtmlCombinators.hs:199
1169--
1170-- | Combinator for the @\<noscript>@ element.
1171--
1172-- Example:
1173--
1174-- > noscript $ span $ toHtml "foo"
1175--
1176-- Result:
1177--
1178-- > <noscript><span>foo</span></noscript>
1179--
1180noscript :: Html  -- ^ Inner HTML.
1181         -> Html  -- ^ Resulting HTML.
1182noscript = Parent "noscript" "<noscript" "</noscript>"
1183{-# INLINE noscript #-}
1184
1185-- WARNING: The next block of code was automatically generated by
1186-- src/Util/GenerateHtmlCombinators.hs:199
1187--
1188-- | Combinator for the @\<object>@ element.
1189--
1190-- Example:
1191--
1192-- > object $ span $ toHtml "foo"
1193--
1194-- Result:
1195--
1196-- > <object><span>foo</span></object>
1197--
1198object :: Html  -- ^ Inner HTML.
1199       -> Html  -- ^ Resulting HTML.
1200object = Parent "object" "<object" "</object>"
1201{-# INLINE object #-}
1202
1203-- WARNING: The next block of code was automatically generated by
1204-- src/Util/GenerateHtmlCombinators.hs:199
1205--
1206-- | Combinator for the @\<ol>@ element.
1207--
1208-- Example:
1209--
1210-- > ol $ span $ toHtml "foo"
1211--
1212-- Result:
1213--
1214-- > <ol><span>foo</span></ol>
1215--
1216ol :: Html  -- ^ Inner HTML.
1217   -> Html  -- ^ Resulting HTML.
1218ol = Parent "ol" "<ol" "</ol>"
1219{-# INLINE ol #-}
1220
1221-- WARNING: The next block of code was automatically generated by
1222-- src/Util/GenerateHtmlCombinators.hs:199
1223--
1224-- | Combinator for the @\<optgroup>@ element.
1225--
1226-- Example:
1227--
1228-- > optgroup $ span $ toHtml "foo"
1229--
1230-- Result:
1231--
1232-- > <optgroup><span>foo</span></optgroup>
1233--
1234optgroup :: Html  -- ^ Inner HTML.
1235         -> Html  -- ^ Resulting HTML.
1236optgroup = Parent "optgroup" "<optgroup" "</optgroup>"
1237{-# INLINE optgroup #-}
1238
1239-- WARNING: The next block of code was automatically generated by
1240-- src/Util/GenerateHtmlCombinators.hs:199
1241--
1242-- | Combinator for the @\<option>@ element.
1243--
1244-- Example:
1245--
1246-- > option $ span $ toHtml "foo"
1247--
1248-- Result:
1249--
1250-- > <option><span>foo</span></option>
1251--
1252option :: Html  -- ^ Inner HTML.
1253       -> Html  -- ^ Resulting HTML.
1254option = Parent "option" "<option" "</option>"
1255{-# INLINE option #-}
1256
1257-- WARNING: The next block of code was automatically generated by
1258-- src/Util/GenerateHtmlCombinators.hs:199
1259--
1260-- | Combinator for the @\<p>@ element.
1261--
1262-- Example:
1263--
1264-- > p $ span $ toHtml "foo"
1265--
1266-- Result:
1267--
1268-- > <p><span>foo</span></p>
1269--
1270p :: Html  -- ^ Inner HTML.
1271  -> Html  -- ^ Resulting HTML.
1272p = Parent "p" "<p" "</p>"
1273{-# INLINE p #-}
1274
1275-- WARNING: The next block of code was automatically generated by
1276-- src/Util/GenerateHtmlCombinators.hs:226
1277--
1278-- | Combinator for the @\<param />@ element.
1279--
1280-- Example:
1281--
1282-- > param
1283--
1284-- Result:
1285--
1286-- > <param />
1287--
1288param :: Html  -- ^ Resulting HTML.
1289param = Leaf "param" "<param" ">" ()
1290{-# INLINE param #-}
1291
1292-- WARNING: The next block of code was automatically generated by
1293-- src/Util/GenerateHtmlCombinators.hs:199
1294--
1295-- | Combinator for the @\<pre>@ element.
1296--
1297-- Example:
1298--
1299-- > pre $ span $ toHtml "foo"
1300--
1301-- Result:
1302--
1303-- > <pre><span>foo</span></pre>
1304--
1305pre :: Html  -- ^ Inner HTML.
1306    -> Html  -- ^ Resulting HTML.
1307pre = Parent "pre" "<pre" "</pre>"
1308{-# INLINE pre #-}
1309
1310-- WARNING: The next block of code was automatically generated by
1311-- src/Util/GenerateHtmlCombinators.hs:199
1312--
1313-- | Combinator for the @\<q>@ element.
1314--
1315-- Example:
1316--
1317-- > q $ span $ toHtml "foo"
1318--
1319-- Result:
1320--
1321-- > <q><span>foo</span></q>
1322--
1323q :: Html  -- ^ Inner HTML.
1324  -> Html  -- ^ Resulting HTML.
1325q = Parent "q" "<q" "</q>"
1326{-# INLINE q #-}
1327
1328-- WARNING: The next block of code was automatically generated by
1329-- src/Util/GenerateHtmlCombinators.hs:199
1330--
1331-- | Combinator for the @\<s>@ element.
1332--
1333-- Example:
1334--
1335-- > s $ span $ toHtml "foo"
1336--
1337-- Result:
1338--
1339-- > <s><span>foo</span></s>
1340--
1341s :: Html  -- ^ Inner HTML.
1342  -> Html  -- ^ Resulting HTML.
1343s = Parent "s" "<s" "</s>"
1344{-# INLINE s #-}
1345
1346-- WARNING: The next block of code was automatically generated by
1347-- src/Util/GenerateHtmlCombinators.hs:199
1348--
1349-- | Combinator for the @\<samp>@ element.
1350--
1351-- Example:
1352--
1353-- > samp $ span $ toHtml "foo"
1354--
1355-- Result:
1356--
1357-- > <samp><span>foo</span></samp>
1358--
1359samp :: Html  -- ^ Inner HTML.
1360     -> Html  -- ^ Resulting HTML.
1361samp = Parent "samp" "<samp" "</samp>"
1362{-# INLINE samp #-}
1363
1364-- WARNING: The next block of code was automatically generated by
1365-- src/Util/GenerateHtmlCombinators.hs:199
1366--
1367-- | Combinator for the @\<script>@ element.
1368--
1369-- Example:
1370--
1371-- > script $ span $ toHtml "foo"
1372--
1373-- Result:
1374--
1375-- > <script><span>foo</span></script>
1376--
1377script :: Html  -- ^ Inner HTML.
1378       -> Html  -- ^ Resulting HTML.
1379script = Parent "script" "<script" "</script>" . external
1380{-# INLINE script #-}
1381
1382-- WARNING: The next block of code was automatically generated by
1383-- src/Util/GenerateHtmlCombinators.hs:199
1384--
1385-- | Combinator for the @\<select>@ element.
1386--
1387-- Example:
1388--
1389-- > select $ span $ toHtml "foo"
1390--
1391-- Result:
1392--
1393-- > <select><span>foo</span></select>
1394--
1395select :: Html  -- ^ Inner HTML.
1396       -> Html  -- ^ Resulting HTML.
1397select = Parent "select" "<select" "</select>"
1398{-# INLINE select #-}
1399
1400-- WARNING: The next block of code was automatically generated by
1401-- src/Util/GenerateHtmlCombinators.hs:199
1402--
1403-- | Combinator for the @\<small>@ element.
1404--
1405-- Example:
1406--
1407-- > small $ span $ toHtml "foo"
1408--
1409-- Result:
1410--
1411-- > <small><span>foo</span></small>
1412--
1413small :: Html  -- ^ Inner HTML.
1414      -> Html  -- ^ Resulting HTML.
1415small = Parent "small" "<small" "</small>"
1416{-# INLINE small #-}
1417
1418-- WARNING: The next block of code was automatically generated by
1419-- src/Util/GenerateHtmlCombinators.hs:199
1420--
1421-- | Combinator for the @\<span>@ element.
1422--
1423-- Example:
1424--
1425-- > span $ span $ toHtml "foo"
1426--
1427-- Result:
1428--
1429-- > <span><span>foo</span></span>
1430--
1431span :: Html  -- ^ Inner HTML.
1432     -> Html  -- ^ Resulting HTML.
1433span = Parent "span" "<span" "</span>"
1434{-# INLINE span #-}
1435
1436-- WARNING: The next block of code was automatically generated by
1437-- src/Util/GenerateHtmlCombinators.hs:199
1438--
1439-- | Combinator for the @\<strong>@ element.
1440--
1441-- Example:
1442--
1443-- > strong $ span $ toHtml "foo"
1444--
1445-- Result:
1446--
1447-- > <strong><span>foo</span></strong>
1448--
1449strong :: Html  -- ^ Inner HTML.
1450       -> Html  -- ^ Resulting HTML.
1451strong = Parent "strong" "<strong" "</strong>"
1452{-# INLINE strong #-}
1453
1454-- WARNING: The next block of code was automatically generated by
1455-- src/Util/GenerateHtmlCombinators.hs:199
1456--
1457-- | Combinator for the @\<style>@ element.
1458--
1459-- Example:
1460--
1461-- > style $ span $ toHtml "foo"
1462--
1463-- Result:
1464--
1465-- > <style><span>foo</span></style>
1466--
1467style :: Html  -- ^ Inner HTML.
1468      -> Html  -- ^ Resulting HTML.
1469style = Parent "style" "<style" "</style>" . external
1470{-# INLINE style #-}
1471
1472-- WARNING: The next block of code was automatically generated by
1473-- src/Util/GenerateHtmlCombinators.hs:199
1474--
1475-- | Combinator for the @\<sub>@ element.
1476--
1477-- Example:
1478--
1479-- > sub $ span $ toHtml "foo"
1480--
1481-- Result:
1482--
1483-- > <sub><span>foo</span></sub>
1484--
1485sub :: Html  -- ^ Inner HTML.
1486    -> Html  -- ^ Resulting HTML.
1487sub = Parent "sub" "<sub" "</sub>"
1488{-# INLINE sub #-}
1489
1490-- WARNING: The next block of code was automatically generated by
1491-- src/Util/GenerateHtmlCombinators.hs:199
1492--
1493-- | Combinator for the @\<sup>@ element.
1494--
1495-- Example:
1496--
1497-- > sup $ span $ toHtml "foo"
1498--
1499-- Result:
1500--
1501-- > <sup><span>foo</span></sup>
1502--
1503sup :: Html  -- ^ Inner HTML.
1504    -> Html  -- ^ Resulting HTML.
1505sup = Parent "sup" "<sup" "</sup>"
1506{-# INLINE sup #-}
1507
1508-- WARNING: The next block of code was automatically generated by
1509-- src/Util/GenerateHtmlCombinators.hs:199
1510--
1511-- | Combinator for the @\<table>@ element.
1512--
1513-- Example:
1514--
1515-- > table $ span $ toHtml "foo"
1516--
1517-- Result:
1518--
1519-- > <table><span>foo</span></table>
1520--
1521table :: Html  -- ^ Inner HTML.
1522      -> Html  -- ^ Resulting HTML.
1523table = Parent "table" "<table" "</table>"
1524{-# INLINE table #-}
1525
1526-- WARNING: The next block of code was automatically generated by
1527-- src/Util/GenerateHtmlCombinators.hs:199
1528--
1529-- | Combinator for the @\<tbody>@ element.
1530--
1531-- Example:
1532--
1533-- > tbody $ span $ toHtml "foo"
1534--
1535-- Result:
1536--
1537-- > <tbody><span>foo</span></tbody>
1538--
1539tbody :: Html  -- ^ Inner HTML.
1540      -> Html  -- ^ Resulting HTML.
1541tbody = Parent "tbody" "<tbody" "</tbody>"
1542{-# INLINE tbody #-}
1543
1544-- WARNING: The next block of code was automatically generated by
1545-- src/Util/GenerateHtmlCombinators.hs:199
1546--
1547-- | Combinator for the @\<td>@ element.
1548--
1549-- Example:
1550--
1551-- > td $ span $ toHtml "foo"
1552--
1553-- Result:
1554--
1555-- > <td><span>foo</span></td>
1556--
1557td :: Html  -- ^ Inner HTML.
1558   -> Html  -- ^ Resulting HTML.
1559td = Parent "td" "<td" "</td>"
1560{-# INLINE td #-}
1561
1562-- WARNING: The next block of code was automatically generated by
1563-- src/Util/GenerateHtmlCombinators.hs:199
1564--
1565-- | Combinator for the @\<textarea>@ element.
1566--
1567-- Example:
1568--
1569-- > textarea $ span $ toHtml "foo"
1570--
1571-- Result:
1572--
1573-- > <textarea><span>foo</span></textarea>
1574--
1575textarea :: Html  -- ^ Inner HTML.
1576         -> Html  -- ^ Resulting HTML.
1577textarea = Parent "textarea" "<textarea" "</textarea>"
1578{-# INLINE textarea #-}
1579
1580-- WARNING: The next block of code was automatically generated by
1581-- src/Util/GenerateHtmlCombinators.hs:199
1582--
1583-- | Combinator for the @\<tfoot>@ element.
1584--
1585-- Example:
1586--
1587-- > tfoot $ span $ toHtml "foo"
1588--
1589-- Result:
1590--
1591-- > <tfoot><span>foo</span></tfoot>
1592--
1593tfoot :: Html  -- ^ Inner HTML.
1594      -> Html  -- ^ Resulting HTML.
1595tfoot = Parent "tfoot" "<tfoot" "</tfoot>"
1596{-# INLINE tfoot #-}
1597
1598-- WARNING: The next block of code was automatically generated by
1599-- src/Util/GenerateHtmlCombinators.hs:199
1600--
1601-- | Combinator for the @\<th>@ element.
1602--
1603-- Example:
1604--
1605-- > th $ span $ toHtml "foo"
1606--
1607-- Result:
1608--
1609-- > <th><span>foo</span></th>
1610--
1611th :: Html  -- ^ Inner HTML.
1612   -> Html  -- ^ Resulting HTML.
1613th = Parent "th" "<th" "</th>"
1614{-# INLINE th #-}
1615
1616-- WARNING: The next block of code was automatically generated by
1617-- src/Util/GenerateHtmlCombinators.hs:199
1618--
1619-- | Combinator for the @\<thead>@ element.
1620--
1621-- Example:
1622--
1623-- > thead $ span $ toHtml "foo"
1624--
1625-- Result:
1626--
1627-- > <thead><span>foo</span></thead>
1628--
1629thead :: Html  -- ^ Inner HTML.
1630      -> Html  -- ^ Resulting HTML.
1631thead = Parent "thead" "<thead" "</thead>"
1632{-# INLINE thead #-}
1633
1634-- WARNING: The next block of code was automatically generated by
1635-- src/Util/GenerateHtmlCombinators.hs:199
1636--
1637-- | Combinator for the @\<title>@ element.
1638--
1639-- Example:
1640--
1641-- > title $ span $ toHtml "foo"
1642--
1643-- Result:
1644--
1645-- > <title><span>foo</span></title>
1646--
1647title :: Html  -- ^ Inner HTML.
1648      -> Html  -- ^ Resulting HTML.
1649title = Parent "title" "<title" "</title>"
1650{-# INLINE title #-}
1651
1652-- WARNING: The next block of code was automatically generated by
1653-- src/Util/GenerateHtmlCombinators.hs:199
1654--
1655-- | Combinator for the @\<tr>@ element.
1656--
1657-- Example:
1658--
1659-- > tr $ span $ toHtml "foo"
1660--
1661-- Result:
1662--
1663-- > <tr><span>foo</span></tr>
1664--
1665tr :: Html  -- ^ Inner HTML.
1666   -> Html  -- ^ Resulting HTML.
1667tr = Parent "tr" "<tr" "</tr>"
1668{-# INLINE tr #-}
1669
1670-- WARNING: The next block of code was automatically generated by
1671-- src/Util/GenerateHtmlCombinators.hs:199
1672--
1673-- | Combinator for the @\<tt>@ element.
1674--
1675-- Example:
1676--
1677-- > tt $ span $ toHtml "foo"
1678--
1679-- Result:
1680--
1681-- > <tt><span>foo</span></tt>
1682--
1683tt :: Html  -- ^ Inner HTML.
1684   -> Html  -- ^ Resulting HTML.
1685tt = Parent "tt" "<tt" "</tt>"
1686{-# INLINE tt #-}
1687
1688-- WARNING: The next block of code was automatically generated by
1689-- src/Util/GenerateHtmlCombinators.hs:199
1690--
1691-- | Combinator for the @\<u>@ element.
1692--
1693-- Example:
1694--
1695-- > u $ span $ toHtml "foo"
1696--
1697-- Result:
1698--
1699-- > <u><span>foo</span></u>
1700--
1701u :: Html  -- ^ Inner HTML.
1702  -> Html  -- ^ Resulting HTML.
1703u = Parent "u" "<u" "</u>"
1704{-# INLINE u #-}
1705
1706-- WARNING: The next block of code was automatically generated by
1707-- src/Util/GenerateHtmlCombinators.hs:199
1708--
1709-- | Combinator for the @\<ul>@ element.
1710--
1711-- Example:
1712--
1713-- > ul $ span $ toHtml "foo"
1714--
1715-- Result:
1716--
1717-- > <ul><span>foo</span></ul>
1718--
1719ul :: Html  -- ^ Inner HTML.
1720   -> Html  -- ^ Resulting HTML.
1721ul = Parent "ul" "<ul" "</ul>"
1722{-# INLINE ul #-}
1723
1724-- WARNING: The next block of code was automatically generated by
1725-- src/Util/GenerateHtmlCombinators.hs:199
1726--
1727-- | Combinator for the @\<var>@ element.
1728--
1729-- Example:
1730--
1731-- > var $ span $ toHtml "foo"
1732--
1733-- Result:
1734--
1735-- > <var><span>foo</span></var>
1736--
1737var :: Html  -- ^ Inner HTML.
1738    -> Html  -- ^ Resulting HTML.
1739var = Parent "var" "<var" "</var>"
1740{-# INLINE var #-}
1741