-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:70
--
{-# LANGUAGE OverloadedStrings #-}
-- | This module exports HTML combinators used to create documents.
--
module Text.Blaze.Html5
    ( module Text.Blaze.Html
    , docType
    , docTypeHtml
    , a
    , abbr
    , address
    , area
    , article
    , aside
    , audio
    , b
    , base
    , bdi
    , bdo
    , blockquote
    , body
    , br
    , button
    , canvas
    , caption
    , cite
    , code
    , col
    , colgroup
    , command
    , data_
    , datalist
    , dd
    , del
    , details
    , dfn
    , dialog
    , div
    , dl
    , dt
    , em
    , embed
    , fieldset
    , figcaption
    , figure
    , footer
    , form
    , h1
    , h2
    , h3
    , h4
    , h5
    , h6
    , head
    , header
    , hgroup
    , hr
    , html
    , i
    , iframe
    , img
    , input
    , ins
    , kbd
    , keygen
    , label
    , legend
    , li
    , link
    , main
    , map
    , mark
    , menu
    , menuitem
    , meta
    , meter
    , nav
    , noscript
    , object
    , ol
    , optgroup
    , option
    , output
    , p
    , param
    , picture
    , pre
    , progress
    , q
    , rp
    , rt
    , ruby
    , s
    , samp
    , script
    , search
    , section
    , select
    , slot
    , small
    , source
    , span
    , strong
    , style
    , sub
    , summary
    , sup
    , table
    , tbody
    , td
    , template
    , textarea
    , tfoot
    , th
    , thead
    , time
    , title
    , tr
    , track
    , u
    , ul
    , var
    , video
    , wbr
    ) where

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:78
--
import Prelude ((>>), (.))

import Text.Blaze
import Text.Blaze.Internal
import Text.Blaze.Html

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:157
--
-- | Combinator for the document type. This should be placed at the top
-- of every HTML page.
--
-- Example:
--
-- > docType
--
-- Result:
--
-- > <!DOCTYPE HTML>
--
docType :: Html  -- ^ The document type HTML.
docType :: Html
docType = Text -> Html
preEscapedText Text
"<!DOCTYPE HTML>\n"
{-# INLINE docType #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:178
--
-- | Combinator for the @\<html>@ element. This combinator will also
-- insert the correct doctype.
--
-- Example:
--
-- > docTypeHtml $ span $ toHtml "foo"
--
-- Result:
--
-- > <!DOCTYPE HTML>
-- > <html><span>foo</span></html>
--
docTypeHtml :: Html  -- ^ Inner HTML.
            -> Html  -- ^ Resulting HTML.
docTypeHtml :: Html -> Html
docTypeHtml Html
inner = Html
docType Html -> Html -> Html
forall a b. MarkupM a -> MarkupM b -> MarkupM b
forall (m :: * -> *) a b. Monad m => m a -> m b -> m b
>> Html -> Html
html Html
inner
{-# INLINE docTypeHtml #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<a>@ element.
--
-- Example:
--
-- > a $ span $ toHtml "foo"
--
-- Result:
--
-- > <a><span>foo</span></a>
--
a :: Html  -- ^ Inner HTML.
  -> Html  -- ^ Resulting HTML.
a :: Html -> Html
a = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"a" StaticString
"<a" StaticString
"</a>"
{-# INLINE a #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<abbr>@ element.
--
-- Example:
--
-- > abbr $ span $ toHtml "foo"
--
-- Result:
--
-- > <abbr><span>foo</span></abbr>
--
abbr :: Html  -- ^ Inner HTML.
     -> Html  -- ^ Resulting HTML.
abbr :: Html -> Html
abbr = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"abbr" StaticString
"<abbr" StaticString
"</abbr>"
{-# INLINE abbr #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<address>@ element.
--
-- Example:
--
-- > address $ span $ toHtml "foo"
--
-- Result:
--
-- > <address><span>foo</span></address>
--
address :: Html  -- ^ Inner HTML.
        -> Html  -- ^ Resulting HTML.
address :: Html -> Html
address = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"address" StaticString
"<address" StaticString
"</address>"
{-# INLINE address #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:227
--
-- | Combinator for the @\<area />@ element.
--
-- Example:
--
-- > area
--
-- Result:
--
-- > <area />
--
area :: Html  -- ^ Resulting HTML.
area :: Html
area = StaticString -> StaticString -> StaticString -> () -> Html
forall a.
StaticString -> StaticString -> StaticString -> a -> MarkupM a
Leaf StaticString
"area" StaticString
"<area" StaticString
">" ()
{-# INLINE area #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<article>@ element.
--
-- Example:
--
-- > article $ span $ toHtml "foo"
--
-- Result:
--
-- > <article><span>foo</span></article>
--
article :: Html  -- ^ Inner HTML.
        -> Html  -- ^ Resulting HTML.
article :: Html -> Html
article = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"article" StaticString
"<article" StaticString
"</article>"
{-# INLINE article #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<aside>@ element.
--
-- Example:
--
-- > aside $ span $ toHtml "foo"
--
-- Result:
--
-- > <aside><span>foo</span></aside>
--
aside :: Html  -- ^ Inner HTML.
      -> Html  -- ^ Resulting HTML.
aside :: Html -> Html
aside = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"aside" StaticString
"<aside" StaticString
"</aside>"
{-# INLINE aside #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<audio>@ element.
--
-- Example:
--
-- > audio $ span $ toHtml "foo"
--
-- Result:
--
-- > <audio><span>foo</span></audio>
--
audio :: Html  -- ^ Inner HTML.
      -> Html  -- ^ Resulting HTML.
audio :: Html -> Html
audio = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"audio" StaticString
"<audio" StaticString
"</audio>"
{-# INLINE audio #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<b>@ element.
--
-- Example:
--
-- > b $ span $ toHtml "foo"
--
-- Result:
--
-- > <b><span>foo</span></b>
--
b :: Html  -- ^ Inner HTML.
  -> Html  -- ^ Resulting HTML.
b :: Html -> Html
b = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"b" StaticString
"<b" StaticString
"</b>"
{-# INLINE b #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:227
--
-- | Combinator for the @\<base />@ element.
--
-- Example:
--
-- > base
--
-- Result:
--
-- > <base />
--
base :: Html  -- ^ Resulting HTML.
base :: Html
base = StaticString -> StaticString -> StaticString -> () -> Html
forall a.
StaticString -> StaticString -> StaticString -> a -> MarkupM a
Leaf StaticString
"base" StaticString
"<base" StaticString
">" ()
{-# INLINE base #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<bdi>@ element.
--
-- Example:
--
-- > bdi $ span $ toHtml "foo"
--
-- Result:
--
-- > <bdi><span>foo</span></bdi>
--
bdi :: Html  -- ^ Inner HTML.
    -> Html  -- ^ Resulting HTML.
bdi :: Html -> Html
bdi = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"bdi" StaticString
"<bdi" StaticString
"</bdi>"
{-# INLINE bdi #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<bdo>@ element.
--
-- Example:
--
-- > bdo $ span $ toHtml "foo"
--
-- Result:
--
-- > <bdo><span>foo</span></bdo>
--
bdo :: Html  -- ^ Inner HTML.
    -> Html  -- ^ Resulting HTML.
bdo :: Html -> Html
bdo = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"bdo" StaticString
"<bdo" StaticString
"</bdo>"
{-# INLINE bdo #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<blockquote>@ element.
--
-- Example:
--
-- > blockquote $ span $ toHtml "foo"
--
-- Result:
--
-- > <blockquote><span>foo</span></blockquote>
--
blockquote :: Html  -- ^ Inner HTML.
           -> Html  -- ^ Resulting HTML.
blockquote :: Html -> Html
blockquote = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"blockquote" StaticString
"<blockquote" StaticString
"</blockquote>"
{-# INLINE blockquote #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<body>@ element.
--
-- Example:
--
-- > body $ span $ toHtml "foo"
--
-- Result:
--
-- > <body><span>foo</span></body>
--
body :: Html  -- ^ Inner HTML.
     -> Html  -- ^ Resulting HTML.
body :: Html -> Html
body = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"body" StaticString
"<body" StaticString
"</body>"
{-# INLINE body #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:227
--
-- | Combinator for the @\<br />@ element.
--
-- Example:
--
-- > br
--
-- Result:
--
-- > <br />
--
br :: Html  -- ^ Resulting HTML.
br :: Html
br = StaticString -> StaticString -> StaticString -> () -> Html
forall a.
StaticString -> StaticString -> StaticString -> a -> MarkupM a
Leaf StaticString
"br" StaticString
"<br" StaticString
">" ()
{-# INLINE br #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<button>@ element.
--
-- Example:
--
-- > button $ span $ toHtml "foo"
--
-- Result:
--
-- > <button><span>foo</span></button>
--
button :: Html  -- ^ Inner HTML.
       -> Html  -- ^ Resulting HTML.
button :: Html -> Html
button = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"button" StaticString
"<button" StaticString
"</button>"
{-# INLINE button #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<canvas>@ element.
--
-- Example:
--
-- > canvas $ span $ toHtml "foo"
--
-- Result:
--
-- > <canvas><span>foo</span></canvas>
--
canvas :: Html  -- ^ Inner HTML.
       -> Html  -- ^ Resulting HTML.
canvas :: Html -> Html
canvas = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"canvas" StaticString
"<canvas" StaticString
"</canvas>"
{-# INLINE canvas #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<caption>@ element.
--
-- Example:
--
-- > caption $ span $ toHtml "foo"
--
-- Result:
--
-- > <caption><span>foo</span></caption>
--
caption :: Html  -- ^ Inner HTML.
        -> Html  -- ^ Resulting HTML.
caption :: Html -> Html
caption = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"caption" StaticString
"<caption" StaticString
"</caption>"
{-# INLINE caption #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<cite>@ element.
--
-- Example:
--
-- > cite $ span $ toHtml "foo"
--
-- Result:
--
-- > <cite><span>foo</span></cite>
--
cite :: Html  -- ^ Inner HTML.
     -> Html  -- ^ Resulting HTML.
cite :: Html -> Html
cite = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"cite" StaticString
"<cite" StaticString
"</cite>"
{-# INLINE cite #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<code>@ element.
--
-- Example:
--
-- > code $ span $ toHtml "foo"
--
-- Result:
--
-- > <code><span>foo</span></code>
--
code :: Html  -- ^ Inner HTML.
     -> Html  -- ^ Resulting HTML.
code :: Html -> Html
code = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"code" StaticString
"<code" StaticString
"</code>"
{-# INLINE code #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:227
--
-- | Combinator for the @\<col />@ element.
--
-- Example:
--
-- > col
--
-- Result:
--
-- > <col />
--
col :: Html  -- ^ Resulting HTML.
col :: Html
col = StaticString -> StaticString -> StaticString -> () -> Html
forall a.
StaticString -> StaticString -> StaticString -> a -> MarkupM a
Leaf StaticString
"col" StaticString
"<col" StaticString
">" ()
{-# INLINE col #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<colgroup>@ element.
--
-- Example:
--
-- > colgroup $ span $ toHtml "foo"
--
-- Result:
--
-- > <colgroup><span>foo</span></colgroup>
--
colgroup :: Html  -- ^ Inner HTML.
         -> Html  -- ^ Resulting HTML.
colgroup :: Html -> Html
colgroup = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"colgroup" StaticString
"<colgroup" StaticString
"</colgroup>"
{-# INLINE colgroup #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<command>@ element.
--
-- Example:
--
-- > command $ span $ toHtml "foo"
--
-- Result:
--
-- > <command><span>foo</span></command>
--
command :: Html  -- ^ Inner HTML.
        -> Html  -- ^ Resulting HTML.
command :: Html -> Html
command = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"command" StaticString
"<command" StaticString
"</command>"
{-# INLINE command #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<data>@ element.
--
-- Example:
--
-- > data_ $ span $ toHtml "foo"
--
-- Result:
--
-- > <data><span>foo</span></data>
--
data_ :: Html  -- ^ Inner HTML.
      -> Html  -- ^ Resulting HTML.
data_ :: Html -> Html
data_ = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"data" StaticString
"<data" StaticString
"</data>"
{-# INLINE data_ #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<datalist>@ element.
--
-- Example:
--
-- > datalist $ span $ toHtml "foo"
--
-- Result:
--
-- > <datalist><span>foo</span></datalist>
--
datalist :: Html  -- ^ Inner HTML.
         -> Html  -- ^ Resulting HTML.
datalist :: Html -> Html
datalist = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"datalist" StaticString
"<datalist" StaticString
"</datalist>"
{-# INLINE datalist #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<dd>@ element.
--
-- Example:
--
-- > dd $ span $ toHtml "foo"
--
-- Result:
--
-- > <dd><span>foo</span></dd>
--
dd :: Html  -- ^ Inner HTML.
   -> Html  -- ^ Resulting HTML.
dd :: Html -> Html
dd = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"dd" StaticString
"<dd" StaticString
"</dd>"
{-# INLINE dd #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<del>@ element.
--
-- Example:
--
-- > del $ span $ toHtml "foo"
--
-- Result:
--
-- > <del><span>foo</span></del>
--
del :: Html  -- ^ Inner HTML.
    -> Html  -- ^ Resulting HTML.
del :: Html -> Html
del = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"del" StaticString
"<del" StaticString
"</del>"
{-# INLINE del #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<details>@ element.
--
-- Example:
--
-- > details $ span $ toHtml "foo"
--
-- Result:
--
-- > <details><span>foo</span></details>
--
details :: Html  -- ^ Inner HTML.
        -> Html  -- ^ Resulting HTML.
details :: Html -> Html
details = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"details" StaticString
"<details" StaticString
"</details>"
{-# INLINE details #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<dfn>@ element.
--
-- Example:
--
-- > dfn $ span $ toHtml "foo"
--
-- Result:
--
-- > <dfn><span>foo</span></dfn>
--
dfn :: Html  -- ^ Inner HTML.
    -> Html  -- ^ Resulting HTML.
dfn :: Html -> Html
dfn = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"dfn" StaticString
"<dfn" StaticString
"</dfn>"
{-# INLINE dfn #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<dialog>@ element.
--
-- Example:
--
-- > dialog $ span $ toHtml "foo"
--
-- Result:
--
-- > <dialog><span>foo</span></dialog>
--
dialog :: Html  -- ^ Inner HTML.
       -> Html  -- ^ Resulting HTML.
dialog :: Html -> Html
dialog = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"dialog" StaticString
"<dialog" StaticString
"</dialog>"
{-# INLINE dialog #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<div>@ element.
--
-- Example:
--
-- > div $ span $ toHtml "foo"
--
-- Result:
--
-- > <div><span>foo</span></div>
--
div :: Html  -- ^ Inner HTML.
    -> Html  -- ^ Resulting HTML.
div :: Html -> Html
div = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"div" StaticString
"<div" StaticString
"</div>"
{-# INLINE div #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<dl>@ element.
--
-- Example:
--
-- > dl $ span $ toHtml "foo"
--
-- Result:
--
-- > <dl><span>foo</span></dl>
--
dl :: Html  -- ^ Inner HTML.
   -> Html  -- ^ Resulting HTML.
dl :: Html -> Html
dl = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"dl" StaticString
"<dl" StaticString
"</dl>"
{-# INLINE dl #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<dt>@ element.
--
-- Example:
--
-- > dt $ span $ toHtml "foo"
--
-- Result:
--
-- > <dt><span>foo</span></dt>
--
dt :: Html  -- ^ Inner HTML.
   -> Html  -- ^ Resulting HTML.
dt :: Html -> Html
dt = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"dt" StaticString
"<dt" StaticString
"</dt>"
{-# INLINE dt #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<em>@ element.
--
-- Example:
--
-- > em $ span $ toHtml "foo"
--
-- Result:
--
-- > <em><span>foo</span></em>
--
em :: Html  -- ^ Inner HTML.
   -> Html  -- ^ Resulting HTML.
em :: Html -> Html
em = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"em" StaticString
"<em" StaticString
"</em>"
{-# INLINE em #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:227
--
-- | Combinator for the @\<embed />@ element.
--
-- Example:
--
-- > embed
--
-- Result:
--
-- > <embed />
--
embed :: Html  -- ^ Resulting HTML.
embed :: Html
embed = StaticString -> StaticString -> StaticString -> () -> Html
forall a.
StaticString -> StaticString -> StaticString -> a -> MarkupM a
Leaf StaticString
"embed" StaticString
"<embed" StaticString
">" ()
{-# INLINE embed #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<fieldset>@ element.
--
-- Example:
--
-- > fieldset $ span $ toHtml "foo"
--
-- Result:
--
-- > <fieldset><span>foo</span></fieldset>
--
fieldset :: Html  -- ^ Inner HTML.
         -> Html  -- ^ Resulting HTML.
fieldset :: Html -> Html
fieldset = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"fieldset" StaticString
"<fieldset" StaticString
"</fieldset>"
{-# INLINE fieldset #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<figcaption>@ element.
--
-- Example:
--
-- > figcaption $ span $ toHtml "foo"
--
-- Result:
--
-- > <figcaption><span>foo</span></figcaption>
--
figcaption :: Html  -- ^ Inner HTML.
           -> Html  -- ^ Resulting HTML.
figcaption :: Html -> Html
figcaption = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"figcaption" StaticString
"<figcaption" StaticString
"</figcaption>"
{-# INLINE figcaption #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<figure>@ element.
--
-- Example:
--
-- > figure $ span $ toHtml "foo"
--
-- Result:
--
-- > <figure><span>foo</span></figure>
--
figure :: Html  -- ^ Inner HTML.
       -> Html  -- ^ Resulting HTML.
figure :: Html -> Html
figure = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"figure" StaticString
"<figure" StaticString
"</figure>"
{-# INLINE figure #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<footer>@ element.
--
-- Example:
--
-- > footer $ span $ toHtml "foo"
--
-- Result:
--
-- > <footer><span>foo</span></footer>
--
footer :: Html  -- ^ Inner HTML.
       -> Html  -- ^ Resulting HTML.
footer :: Html -> Html
footer = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"footer" StaticString
"<footer" StaticString
"</footer>"
{-# INLINE footer #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<form>@ element.
--
-- Example:
--
-- > form $ span $ toHtml "foo"
--
-- Result:
--
-- > <form><span>foo</span></form>
--
form :: Html  -- ^ Inner HTML.
     -> Html  -- ^ Resulting HTML.
form :: Html -> Html
form = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"form" StaticString
"<form" StaticString
"</form>"
{-# INLINE form #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<h1>@ element.
--
-- Example:
--
-- > h1 $ span $ toHtml "foo"
--
-- Result:
--
-- > <h1><span>foo</span></h1>
--
h1 :: Html  -- ^ Inner HTML.
   -> Html  -- ^ Resulting HTML.
h1 :: Html -> Html
h1 = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"h1" StaticString
"<h1" StaticString
"</h1>"
{-# INLINE h1 #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<h2>@ element.
--
-- Example:
--
-- > h2 $ span $ toHtml "foo"
--
-- Result:
--
-- > <h2><span>foo</span></h2>
--
h2 :: Html  -- ^ Inner HTML.
   -> Html  -- ^ Resulting HTML.
h2 :: Html -> Html
h2 = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"h2" StaticString
"<h2" StaticString
"</h2>"
{-# INLINE h2 #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<h3>@ element.
--
-- Example:
--
-- > h3 $ span $ toHtml "foo"
--
-- Result:
--
-- > <h3><span>foo</span></h3>
--
h3 :: Html  -- ^ Inner HTML.
   -> Html  -- ^ Resulting HTML.
h3 :: Html -> Html
h3 = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"h3" StaticString
"<h3" StaticString
"</h3>"
{-# INLINE h3 #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<h4>@ element.
--
-- Example:
--
-- > h4 $ span $ toHtml "foo"
--
-- Result:
--
-- > <h4><span>foo</span></h4>
--
h4 :: Html  -- ^ Inner HTML.
   -> Html  -- ^ Resulting HTML.
h4 :: Html -> Html
h4 = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"h4" StaticString
"<h4" StaticString
"</h4>"
{-# INLINE h4 #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<h5>@ element.
--
-- Example:
--
-- > h5 $ span $ toHtml "foo"
--
-- Result:
--
-- > <h5><span>foo</span></h5>
--
h5 :: Html  -- ^ Inner HTML.
   -> Html  -- ^ Resulting HTML.
h5 :: Html -> Html
h5 = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"h5" StaticString
"<h5" StaticString
"</h5>"
{-# INLINE h5 #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<h6>@ element.
--
-- Example:
--
-- > h6 $ span $ toHtml "foo"
--
-- Result:
--
-- > <h6><span>foo</span></h6>
--
h6 :: Html  -- ^ Inner HTML.
   -> Html  -- ^ Resulting HTML.
h6 :: Html -> Html
h6 = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"h6" StaticString
"<h6" StaticString
"</h6>"
{-# INLINE h6 #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<head>@ element.
--
-- Example:
--
-- > head $ span $ toHtml "foo"
--
-- Result:
--
-- > <head><span>foo</span></head>
--
head :: Html  -- ^ Inner HTML.
     -> Html  -- ^ Resulting HTML.
head :: Html -> Html
head = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"head" StaticString
"<head" StaticString
"</head>"
{-# INLINE head #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<header>@ element.
--
-- Example:
--
-- > header $ span $ toHtml "foo"
--
-- Result:
--
-- > <header><span>foo</span></header>
--
header :: Html  -- ^ Inner HTML.
       -> Html  -- ^ Resulting HTML.
header :: Html -> Html
header = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"header" StaticString
"<header" StaticString
"</header>"
{-# INLINE header #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<hgroup>@ element.
--
-- Example:
--
-- > hgroup $ span $ toHtml "foo"
--
-- Result:
--
-- > <hgroup><span>foo</span></hgroup>
--
hgroup :: Html  -- ^ Inner HTML.
       -> Html  -- ^ Resulting HTML.
hgroup :: Html -> Html
hgroup = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"hgroup" StaticString
"<hgroup" StaticString
"</hgroup>"
{-# INLINE hgroup #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:227
--
-- | Combinator for the @\<hr />@ element.
--
-- Example:
--
-- > hr
--
-- Result:
--
-- > <hr />
--
hr :: Html  -- ^ Resulting HTML.
hr :: Html
hr = StaticString -> StaticString -> StaticString -> () -> Html
forall a.
StaticString -> StaticString -> StaticString -> a -> MarkupM a
Leaf StaticString
"hr" StaticString
"<hr" StaticString
">" ()
{-# INLINE hr #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<html>@ element.
--
-- Example:
--
-- > html $ span $ toHtml "foo"
--
-- Result:
--
-- > <html><span>foo</span></html>
--
html :: Html  -- ^ Inner HTML.
     -> Html  -- ^ Resulting HTML.
html :: Html -> Html
html = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"html" StaticString
"<html" StaticString
"</html>"
{-# INLINE html #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<i>@ element.
--
-- Example:
--
-- > i $ span $ toHtml "foo"
--
-- Result:
--
-- > <i><span>foo</span></i>
--
i :: Html  -- ^ Inner HTML.
  -> Html  -- ^ Resulting HTML.
i :: Html -> Html
i = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"i" StaticString
"<i" StaticString
"</i>"
{-# INLINE i #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<iframe>@ element.
--
-- Example:
--
-- > iframe $ span $ toHtml "foo"
--
-- Result:
--
-- > <iframe><span>foo</span></iframe>
--
iframe :: Html  -- ^ Inner HTML.
       -> Html  -- ^ Resulting HTML.
iframe :: Html -> Html
iframe = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"iframe" StaticString
"<iframe" StaticString
"</iframe>"
{-# INLINE iframe #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:227
--
-- | Combinator for the @\<img />@ element.
--
-- Example:
--
-- > img
--
-- Result:
--
-- > <img />
--
img :: Html  -- ^ Resulting HTML.
img :: Html
img = StaticString -> StaticString -> StaticString -> () -> Html
forall a.
StaticString -> StaticString -> StaticString -> a -> MarkupM a
Leaf StaticString
"img" StaticString
"<img" StaticString
">" ()
{-# INLINE img #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:227
--
-- | Combinator for the @\<input />@ element.
--
-- Example:
--
-- > input
--
-- Result:
--
-- > <input />
--
input :: Html  -- ^ Resulting HTML.
input :: Html
input = StaticString -> StaticString -> StaticString -> () -> Html
forall a.
StaticString -> StaticString -> StaticString -> a -> MarkupM a
Leaf StaticString
"input" StaticString
"<input" StaticString
">" ()
{-# INLINE input #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<ins>@ element.
--
-- Example:
--
-- > ins $ span $ toHtml "foo"
--
-- Result:
--
-- > <ins><span>foo</span></ins>
--
ins :: Html  -- ^ Inner HTML.
    -> Html  -- ^ Resulting HTML.
ins :: Html -> Html
ins = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"ins" StaticString
"<ins" StaticString
"</ins>"
{-# INLINE ins #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<kbd>@ element.
--
-- Example:
--
-- > kbd $ span $ toHtml "foo"
--
-- Result:
--
-- > <kbd><span>foo</span></kbd>
--
kbd :: Html  -- ^ Inner HTML.
    -> Html  -- ^ Resulting HTML.
kbd :: Html -> Html
kbd = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"kbd" StaticString
"<kbd" StaticString
"</kbd>"
{-# INLINE kbd #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:227
--
-- | Combinator for the @\<keygen />@ element.
--
-- Example:
--
-- > keygen
--
-- Result:
--
-- > <keygen />
--
keygen :: Html  -- ^ Resulting HTML.
keygen :: Html
keygen = StaticString -> StaticString -> StaticString -> () -> Html
forall a.
StaticString -> StaticString -> StaticString -> a -> MarkupM a
Leaf StaticString
"keygen" StaticString
"<keygen" StaticString
">" ()
{-# INLINE keygen #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<label>@ element.
--
-- Example:
--
-- > label $ span $ toHtml "foo"
--
-- Result:
--
-- > <label><span>foo</span></label>
--
label :: Html  -- ^ Inner HTML.
      -> Html  -- ^ Resulting HTML.
label :: Html -> Html
label = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"label" StaticString
"<label" StaticString
"</label>"
{-# INLINE label #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<legend>@ element.
--
-- Example:
--
-- > legend $ span $ toHtml "foo"
--
-- Result:
--
-- > <legend><span>foo</span></legend>
--
legend :: Html  -- ^ Inner HTML.
       -> Html  -- ^ Resulting HTML.
legend :: Html -> Html
legend = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"legend" StaticString
"<legend" StaticString
"</legend>"
{-# INLINE legend #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<li>@ element.
--
-- Example:
--
-- > li $ span $ toHtml "foo"
--
-- Result:
--
-- > <li><span>foo</span></li>
--
li :: Html  -- ^ Inner HTML.
   -> Html  -- ^ Resulting HTML.
li :: Html -> Html
li = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"li" StaticString
"<li" StaticString
"</li>"
{-# INLINE li #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:227
--
-- | Combinator for the @\<link />@ element.
--
-- Example:
--
-- > link
--
-- Result:
--
-- > <link />
--
link :: Html  -- ^ Resulting HTML.
link :: Html
link = StaticString -> StaticString -> StaticString -> () -> Html
forall a.
StaticString -> StaticString -> StaticString -> a -> MarkupM a
Leaf StaticString
"link" StaticString
"<link" StaticString
">" ()
{-# INLINE link #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<main>@ element.
--
-- Example:
--
-- > main $ span $ toHtml "foo"
--
-- Result:
--
-- > <main><span>foo</span></main>
--
main :: Html  -- ^ Inner HTML.
     -> Html  -- ^ Resulting HTML.
main :: Html -> Html
main = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"main" StaticString
"<main" StaticString
"</main>"
{-# INLINE main #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<map>@ element.
--
-- Example:
--
-- > map $ span $ toHtml "foo"
--
-- Result:
--
-- > <map><span>foo</span></map>
--
map :: Html  -- ^ Inner HTML.
    -> Html  -- ^ Resulting HTML.
map :: Html -> Html
map = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"map" StaticString
"<map" StaticString
"</map>"
{-# INLINE map #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<mark>@ element.
--
-- Example:
--
-- > mark $ span $ toHtml "foo"
--
-- Result:
--
-- > <mark><span>foo</span></mark>
--
mark :: Html  -- ^ Inner HTML.
     -> Html  -- ^ Resulting HTML.
mark :: Html -> Html
mark = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"mark" StaticString
"<mark" StaticString
"</mark>"
{-# INLINE mark #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<menu>@ element.
--
-- Example:
--
-- > menu $ span $ toHtml "foo"
--
-- Result:
--
-- > <menu><span>foo</span></menu>
--
menu :: Html  -- ^ Inner HTML.
     -> Html  -- ^ Resulting HTML.
menu :: Html -> Html
menu = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"menu" StaticString
"<menu" StaticString
"</menu>"
{-# INLINE menu #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:227
--
-- | Combinator for the @\<menuitem />@ element.
--
-- Example:
--
-- > menuitem
--
-- Result:
--
-- > <menuitem />
--
menuitem :: Html  -- ^ Resulting HTML.
menuitem :: Html
menuitem = StaticString -> StaticString -> StaticString -> () -> Html
forall a.
StaticString -> StaticString -> StaticString -> a -> MarkupM a
Leaf StaticString
"menuitem" StaticString
"<menuitem" StaticString
">" ()
{-# INLINE menuitem #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:227
--
-- | Combinator for the @\<meta />@ element.
--
-- Example:
--
-- > meta
--
-- Result:
--
-- > <meta />
--
meta :: Html  -- ^ Resulting HTML.
meta :: Html
meta = StaticString -> StaticString -> StaticString -> () -> Html
forall a.
StaticString -> StaticString -> StaticString -> a -> MarkupM a
Leaf StaticString
"meta" StaticString
"<meta" StaticString
">" ()
{-# INLINE meta #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<meter>@ element.
--
-- Example:
--
-- > meter $ span $ toHtml "foo"
--
-- Result:
--
-- > <meter><span>foo</span></meter>
--
meter :: Html  -- ^ Inner HTML.
      -> Html  -- ^ Resulting HTML.
meter :: Html -> Html
meter = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"meter" StaticString
"<meter" StaticString
"</meter>"
{-# INLINE meter #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<nav>@ element.
--
-- Example:
--
-- > nav $ span $ toHtml "foo"
--
-- Result:
--
-- > <nav><span>foo</span></nav>
--
nav :: Html  -- ^ Inner HTML.
    -> Html  -- ^ Resulting HTML.
nav :: Html -> Html
nav = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"nav" StaticString
"<nav" StaticString
"</nav>"
{-# INLINE nav #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<noscript>@ element.
--
-- Example:
--
-- > noscript $ span $ toHtml "foo"
--
-- Result:
--
-- > <noscript><span>foo</span></noscript>
--
noscript :: Html  -- ^ Inner HTML.
         -> Html  -- ^ Resulting HTML.
noscript :: Html -> Html
noscript = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"noscript" StaticString
"<noscript" StaticString
"</noscript>"
{-# INLINE noscript #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<object>@ element.
--
-- Example:
--
-- > object $ span $ toHtml "foo"
--
-- Result:
--
-- > <object><span>foo</span></object>
--
object :: Html  -- ^ Inner HTML.
       -> Html  -- ^ Resulting HTML.
object :: Html -> Html
object = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"object" StaticString
"<object" StaticString
"</object>"
{-# INLINE object #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<ol>@ element.
--
-- Example:
--
-- > ol $ span $ toHtml "foo"
--
-- Result:
--
-- > <ol><span>foo</span></ol>
--
ol :: Html  -- ^ Inner HTML.
   -> Html  -- ^ Resulting HTML.
ol :: Html -> Html
ol = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"ol" StaticString
"<ol" StaticString
"</ol>"
{-# INLINE ol #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<optgroup>@ element.
--
-- Example:
--
-- > optgroup $ span $ toHtml "foo"
--
-- Result:
--
-- > <optgroup><span>foo</span></optgroup>
--
optgroup :: Html  -- ^ Inner HTML.
         -> Html  -- ^ Resulting HTML.
optgroup :: Html -> Html
optgroup = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"optgroup" StaticString
"<optgroup" StaticString
"</optgroup>"
{-# INLINE optgroup #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<option>@ element.
--
-- Example:
--
-- > option $ span $ toHtml "foo"
--
-- Result:
--
-- > <option><span>foo</span></option>
--
option :: Html  -- ^ Inner HTML.
       -> Html  -- ^ Resulting HTML.
option :: Html -> Html
option = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"option" StaticString
"<option" StaticString
"</option>"
{-# INLINE option #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<output>@ element.
--
-- Example:
--
-- > output $ span $ toHtml "foo"
--
-- Result:
--
-- > <output><span>foo</span></output>
--
output :: Html  -- ^ Inner HTML.
       -> Html  -- ^ Resulting HTML.
output :: Html -> Html
output = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"output" StaticString
"<output" StaticString
"</output>"
{-# INLINE output #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<p>@ element.
--
-- Example:
--
-- > p $ span $ toHtml "foo"
--
-- Result:
--
-- > <p><span>foo</span></p>
--
p :: Html  -- ^ Inner HTML.
  -> Html  -- ^ Resulting HTML.
p :: Html -> Html
p = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"p" StaticString
"<p" StaticString
"</p>"
{-# INLINE p #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:227
--
-- | Combinator for the @\<param />@ element.
--
-- Example:
--
-- > param
--
-- Result:
--
-- > <param />
--
param :: Html  -- ^ Resulting HTML.
param :: Html
param = StaticString -> StaticString -> StaticString -> () -> Html
forall a.
StaticString -> StaticString -> StaticString -> a -> MarkupM a
Leaf StaticString
"param" StaticString
"<param" StaticString
">" ()
{-# INLINE param #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<picture>@ element.
--
-- Example:
--
-- > picture $ span $ toHtml "foo"
--
-- Result:
--
-- > <picture><span>foo</span></picture>
--
picture :: Html  -- ^ Inner HTML.
        -> Html  -- ^ Resulting HTML.
picture :: Html -> Html
picture = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"picture" StaticString
"<picture" StaticString
"</picture>"
{-# INLINE picture #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<pre>@ element.
--
-- Example:
--
-- > pre $ span $ toHtml "foo"
--
-- Result:
--
-- > <pre><span>foo</span></pre>
--
pre :: Html  -- ^ Inner HTML.
    -> Html  -- ^ Resulting HTML.
pre :: Html -> Html
pre = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"pre" StaticString
"<pre" StaticString
"</pre>"
{-# INLINE pre #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<progress>@ element.
--
-- Example:
--
-- > progress $ span $ toHtml "foo"
--
-- Result:
--
-- > <progress><span>foo</span></progress>
--
progress :: Html  -- ^ Inner HTML.
         -> Html  -- ^ Resulting HTML.
progress :: Html -> Html
progress = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"progress" StaticString
"<progress" StaticString
"</progress>"
{-# INLINE progress #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<q>@ element.
--
-- Example:
--
-- > q $ span $ toHtml "foo"
--
-- Result:
--
-- > <q><span>foo</span></q>
--
q :: Html  -- ^ Inner HTML.
  -> Html  -- ^ Resulting HTML.
q :: Html -> Html
q = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"q" StaticString
"<q" StaticString
"</q>"
{-# INLINE q #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<rp>@ element.
--
-- Example:
--
-- > rp $ span $ toHtml "foo"
--
-- Result:
--
-- > <rp><span>foo</span></rp>
--
rp :: Html  -- ^ Inner HTML.
   -> Html  -- ^ Resulting HTML.
rp :: Html -> Html
rp = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"rp" StaticString
"<rp" StaticString
"</rp>"
{-# INLINE rp #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<rt>@ element.
--
-- Example:
--
-- > rt $ span $ toHtml "foo"
--
-- Result:
--
-- > <rt><span>foo</span></rt>
--
rt :: Html  -- ^ Inner HTML.
   -> Html  -- ^ Resulting HTML.
rt :: Html -> Html
rt = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"rt" StaticString
"<rt" StaticString
"</rt>"
{-# INLINE rt #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<ruby>@ element.
--
-- Example:
--
-- > ruby $ span $ toHtml "foo"
--
-- Result:
--
-- > <ruby><span>foo</span></ruby>
--
ruby :: Html  -- ^ Inner HTML.
     -> Html  -- ^ Resulting HTML.
ruby :: Html -> Html
ruby = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"ruby" StaticString
"<ruby" StaticString
"</ruby>"
{-# INLINE ruby #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<s>@ element.
--
-- Example:
--
-- > s $ span $ toHtml "foo"
--
-- Result:
--
-- > <s><span>foo</span></s>
--
s :: Html  -- ^ Inner HTML.
  -> Html  -- ^ Resulting HTML.
s :: Html -> Html
s = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"s" StaticString
"<s" StaticString
"</s>"
{-# INLINE s #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<samp>@ element.
--
-- Example:
--
-- > samp $ span $ toHtml "foo"
--
-- Result:
--
-- > <samp><span>foo</span></samp>
--
samp :: Html  -- ^ Inner HTML.
     -> Html  -- ^ Resulting HTML.
samp :: Html -> Html
samp = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"samp" StaticString
"<samp" StaticString
"</samp>"
{-# INLINE samp #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<script>@ element.
--
-- Example:
--
-- > script $ span $ toHtml "foo"
--
-- Result:
--
-- > <script><span>foo</span></script>
--
script :: Html  -- ^ Inner HTML.
       -> Html  -- ^ Resulting HTML.
script :: Html -> Html
script = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"script" StaticString
"<script" StaticString
"</script>" (Html -> Html) -> (Html -> Html) -> Html -> Html
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Html -> Html
forall a. MarkupM a -> MarkupM a
external
{-# INLINE script #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<search>@ element.
--
-- Example:
--
-- > search $ span $ toHtml "foo"
--
-- Result:
--
-- > <search><span>foo</span></search>
--
search :: Html  -- ^ Inner HTML.
       -> Html  -- ^ Resulting HTML.
search :: Html -> Html
search = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"search" StaticString
"<search" StaticString
"</search>"
{-# INLINE search #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<section>@ element.
--
-- Example:
--
-- > section $ span $ toHtml "foo"
--
-- Result:
--
-- > <section><span>foo</span></section>
--
section :: Html  -- ^ Inner HTML.
        -> Html  -- ^ Resulting HTML.
section :: Html -> Html
section = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"section" StaticString
"<section" StaticString
"</section>"
{-# INLINE section #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<select>@ element.
--
-- Example:
--
-- > select $ span $ toHtml "foo"
--
-- Result:
--
-- > <select><span>foo</span></select>
--
select :: Html  -- ^ Inner HTML.
       -> Html  -- ^ Resulting HTML.
select :: Html -> Html
select = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"select" StaticString
"<select" StaticString
"</select>"
{-# INLINE select #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<slot>@ element.
--
-- Example:
--
-- > slot $ span $ toHtml "foo"
--
-- Result:
--
-- > <slot><span>foo</span></slot>
--
slot :: Html  -- ^ Inner HTML.
     -> Html  -- ^ Resulting HTML.
slot :: Html -> Html
slot = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"slot" StaticString
"<slot" StaticString
"</slot>"
{-# INLINE slot #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<small>@ element.
--
-- Example:
--
-- > small $ span $ toHtml "foo"
--
-- Result:
--
-- > <small><span>foo</span></small>
--
small :: Html  -- ^ Inner HTML.
      -> Html  -- ^ Resulting HTML.
small :: Html -> Html
small = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"small" StaticString
"<small" StaticString
"</small>"
{-# INLINE small #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:227
--
-- | Combinator for the @\<source />@ element.
--
-- Example:
--
-- > source
--
-- Result:
--
-- > <source />
--
source :: Html  -- ^ Resulting HTML.
source :: Html
source = StaticString -> StaticString -> StaticString -> () -> Html
forall a.
StaticString -> StaticString -> StaticString -> a -> MarkupM a
Leaf StaticString
"source" StaticString
"<source" StaticString
">" ()
{-# INLINE source #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<span>@ element.
--
-- Example:
--
-- > span $ span $ toHtml "foo"
--
-- Result:
--
-- > <span><span>foo</span></span>
--
span :: Html  -- ^ Inner HTML.
     -> Html  -- ^ Resulting HTML.
span :: Html -> Html
span = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"span" StaticString
"<span" StaticString
"</span>"
{-# INLINE span #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<strong>@ element.
--
-- Example:
--
-- > strong $ span $ toHtml "foo"
--
-- Result:
--
-- > <strong><span>foo</span></strong>
--
strong :: Html  -- ^ Inner HTML.
       -> Html  -- ^ Resulting HTML.
strong :: Html -> Html
strong = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"strong" StaticString
"<strong" StaticString
"</strong>"
{-# INLINE strong #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<style>@ element.
--
-- Example:
--
-- > style $ span $ toHtml "foo"
--
-- Result:
--
-- > <style><span>foo</span></style>
--
style :: Html  -- ^ Inner HTML.
      -> Html  -- ^ Resulting HTML.
style :: Html -> Html
style = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"style" StaticString
"<style" StaticString
"</style>" (Html -> Html) -> (Html -> Html) -> Html -> Html
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Html -> Html
forall a. MarkupM a -> MarkupM a
external
{-# INLINE style #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<sub>@ element.
--
-- Example:
--
-- > sub $ span $ toHtml "foo"
--
-- Result:
--
-- > <sub><span>foo</span></sub>
--
sub :: Html  -- ^ Inner HTML.
    -> Html  -- ^ Resulting HTML.
sub :: Html -> Html
sub = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"sub" StaticString
"<sub" StaticString
"</sub>"
{-# INLINE sub #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<summary>@ element.
--
-- Example:
--
-- > summary $ span $ toHtml "foo"
--
-- Result:
--
-- > <summary><span>foo</span></summary>
--
summary :: Html  -- ^ Inner HTML.
        -> Html  -- ^ Resulting HTML.
summary :: Html -> Html
summary = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"summary" StaticString
"<summary" StaticString
"</summary>"
{-# INLINE summary #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<sup>@ element.
--
-- Example:
--
-- > sup $ span $ toHtml "foo"
--
-- Result:
--
-- > <sup><span>foo</span></sup>
--
sup :: Html  -- ^ Inner HTML.
    -> Html  -- ^ Resulting HTML.
sup :: Html -> Html
sup = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"sup" StaticString
"<sup" StaticString
"</sup>"
{-# INLINE sup #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<table>@ element.
--
-- Example:
--
-- > table $ span $ toHtml "foo"
--
-- Result:
--
-- > <table><span>foo</span></table>
--
table :: Html  -- ^ Inner HTML.
      -> Html  -- ^ Resulting HTML.
table :: Html -> Html
table = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"table" StaticString
"<table" StaticString
"</table>"
{-# INLINE table #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<tbody>@ element.
--
-- Example:
--
-- > tbody $ span $ toHtml "foo"
--
-- Result:
--
-- > <tbody><span>foo</span></tbody>
--
tbody :: Html  -- ^ Inner HTML.
      -> Html  -- ^ Resulting HTML.
tbody :: Html -> Html
tbody = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"tbody" StaticString
"<tbody" StaticString
"</tbody>"
{-# INLINE tbody #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<td>@ element.
--
-- Example:
--
-- > td $ span $ toHtml "foo"
--
-- Result:
--
-- > <td><span>foo</span></td>
--
td :: Html  -- ^ Inner HTML.
   -> Html  -- ^ Resulting HTML.
td :: Html -> Html
td = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"td" StaticString
"<td" StaticString
"</td>"
{-# INLINE td #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<template>@ element.
--
-- Example:
--
-- > template $ span $ toHtml "foo"
--
-- Result:
--
-- > <template><span>foo</span></template>
--
template :: Html  -- ^ Inner HTML.
         -> Html  -- ^ Resulting HTML.
template :: Html -> Html
template = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"template" StaticString
"<template" StaticString
"</template>"
{-# INLINE template #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<textarea>@ element.
--
-- Example:
--
-- > textarea $ span $ toHtml "foo"
--
-- Result:
--
-- > <textarea><span>foo</span></textarea>
--
textarea :: Html  -- ^ Inner HTML.
         -> Html  -- ^ Resulting HTML.
textarea :: Html -> Html
textarea = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"textarea" StaticString
"<textarea" StaticString
"</textarea>"
{-# INLINE textarea #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<tfoot>@ element.
--
-- Example:
--
-- > tfoot $ span $ toHtml "foo"
--
-- Result:
--
-- > <tfoot><span>foo</span></tfoot>
--
tfoot :: Html  -- ^ Inner HTML.
      -> Html  -- ^ Resulting HTML.
tfoot :: Html -> Html
tfoot = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"tfoot" StaticString
"<tfoot" StaticString
"</tfoot>"
{-# INLINE tfoot #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<th>@ element.
--
-- Example:
--
-- > th $ span $ toHtml "foo"
--
-- Result:
--
-- > <th><span>foo</span></th>
--
th :: Html  -- ^ Inner HTML.
   -> Html  -- ^ Resulting HTML.
th :: Html -> Html
th = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"th" StaticString
"<th" StaticString
"</th>"
{-# INLINE th #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<thead>@ element.
--
-- Example:
--
-- > thead $ span $ toHtml "foo"
--
-- Result:
--
-- > <thead><span>foo</span></thead>
--
thead :: Html  -- ^ Inner HTML.
      -> Html  -- ^ Resulting HTML.
thead :: Html -> Html
thead = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"thead" StaticString
"<thead" StaticString
"</thead>"
{-# INLINE thead #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<time>@ element.
--
-- Example:
--
-- > time $ span $ toHtml "foo"
--
-- Result:
--
-- > <time><span>foo</span></time>
--
time :: Html  -- ^ Inner HTML.
     -> Html  -- ^ Resulting HTML.
time :: Html -> Html
time = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"time" StaticString
"<time" StaticString
"</time>"
{-# INLINE time #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<title>@ element.
--
-- Example:
--
-- > title $ span $ toHtml "foo"
--
-- Result:
--
-- > <title><span>foo</span></title>
--
title :: Html  -- ^ Inner HTML.
      -> Html  -- ^ Resulting HTML.
title :: Html -> Html
title = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"title" StaticString
"<title" StaticString
"</title>"
{-# INLINE title #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<tr>@ element.
--
-- Example:
--
-- > tr $ span $ toHtml "foo"
--
-- Result:
--
-- > <tr><span>foo</span></tr>
--
tr :: Html  -- ^ Inner HTML.
   -> Html  -- ^ Resulting HTML.
tr :: Html -> Html
tr = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"tr" StaticString
"<tr" StaticString
"</tr>"
{-# INLINE tr #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:227
--
-- | Combinator for the @\<track />@ element.
--
-- Example:
--
-- > track
--
-- Result:
--
-- > <track />
--
track :: Html  -- ^ Resulting HTML.
track :: Html
track = StaticString -> StaticString -> StaticString -> () -> Html
forall a.
StaticString -> StaticString -> StaticString -> a -> MarkupM a
Leaf StaticString
"track" StaticString
"<track" StaticString
">" ()
{-# INLINE track #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<u>@ element.
--
-- Example:
--
-- > u $ span $ toHtml "foo"
--
-- Result:
--
-- > <u><span>foo</span></u>
--
u :: Html  -- ^ Inner HTML.
  -> Html  -- ^ Resulting HTML.
u :: Html -> Html
u = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"u" StaticString
"<u" StaticString
"</u>"
{-# INLINE u #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<ul>@ element.
--
-- Example:
--
-- > ul $ span $ toHtml "foo"
--
-- Result:
--
-- > <ul><span>foo</span></ul>
--
ul :: Html  -- ^ Inner HTML.
   -> Html  -- ^ Resulting HTML.
ul :: Html -> Html
ul = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"ul" StaticString
"<ul" StaticString
"</ul>"
{-# INLINE ul #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<var>@ element.
--
-- Example:
--
-- > var $ span $ toHtml "foo"
--
-- Result:
--
-- > <var><span>foo</span></var>
--
var :: Html  -- ^ Inner HTML.
    -> Html  -- ^ Resulting HTML.
var :: Html -> Html
var = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"var" StaticString
"<var" StaticString
"</var>"
{-# INLINE var #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:200
--
-- | Combinator for the @\<video>@ element.
--
-- Example:
--
-- > video $ span $ toHtml "foo"
--
-- Result:
--
-- > <video><span>foo</span></video>
--
video :: Html  -- ^ Inner HTML.
      -> Html  -- ^ Resulting HTML.
video :: Html -> Html
video = StaticString -> StaticString -> StaticString -> Html -> Html
forall a.
StaticString
-> StaticString -> StaticString -> MarkupM a -> MarkupM a
Parent StaticString
"video" StaticString
"<video" StaticString
"</video>"
{-# INLINE video #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:227
--
-- | Combinator for the @\<wbr />@ element.
--
-- Example:
--
-- > wbr
--
-- Result:
--
-- > <wbr />
--
wbr :: Html  -- ^ Resulting HTML.
wbr :: Html
wbr = StaticString -> StaticString -> StaticString -> () -> Html
forall a.
StaticString -> StaticString -> StaticString -> a -> MarkupM a
Leaf StaticString
"wbr" StaticString
"<wbr" StaticString
">" ()
{-# INLINE wbr #-}