-- WARNING: This code was automatically generated. You should *never* -- edit it directly. Instead, edit the files who generated this code, -- you can find them in the @util/@ directory. {-# LANGUAGE OverloadedStrings #-} -- ./Util/GenerateHtmlCombinators.hs:78 -- | This module exports HTML combinators used to create documents. -- module Text.Blaze.Html4.Strict -- ./Util/GenerateHtmlCombinators.hs:151 ( module Text.Blaze -- ./Util/GenerateHtmlCombinators.hs:152 , docType -- ./Util/GenerateHtmlCombinators.hs:154 , docTypeHtml -- ./Util/GenerateHtmlCombinators.hs:154 , a -- ./Util/GenerateHtmlCombinators.hs:154 , abbr -- ./Util/GenerateHtmlCombinators.hs:154 , acronym -- ./Util/GenerateHtmlCombinators.hs:154 , address -- ./Util/GenerateHtmlCombinators.hs:154 , area -- ./Util/GenerateHtmlCombinators.hs:154 , b -- ./Util/GenerateHtmlCombinators.hs:154 , bdo -- ./Util/GenerateHtmlCombinators.hs:154 , big -- ./Util/GenerateHtmlCombinators.hs:154 , blockquote -- ./Util/GenerateHtmlCombinators.hs:154 , body -- ./Util/GenerateHtmlCombinators.hs:154 , br -- ./Util/GenerateHtmlCombinators.hs:154 , button -- ./Util/GenerateHtmlCombinators.hs:154 , caption -- ./Util/GenerateHtmlCombinators.hs:154 , cite -- ./Util/GenerateHtmlCombinators.hs:154 , code -- ./Util/GenerateHtmlCombinators.hs:154 , col -- ./Util/GenerateHtmlCombinators.hs:154 , colgroup -- ./Util/GenerateHtmlCombinators.hs:154 , dd -- ./Util/GenerateHtmlCombinators.hs:154 , del -- ./Util/GenerateHtmlCombinators.hs:154 , dfn -- ./Util/GenerateHtmlCombinators.hs:154 , div -- ./Util/GenerateHtmlCombinators.hs:154 , dl -- ./Util/GenerateHtmlCombinators.hs:154 , dt -- ./Util/GenerateHtmlCombinators.hs:154 , em -- ./Util/GenerateHtmlCombinators.hs:154 , fieldset -- ./Util/GenerateHtmlCombinators.hs:154 , form -- ./Util/GenerateHtmlCombinators.hs:154 , h1 -- ./Util/GenerateHtmlCombinators.hs:154 , h2 -- ./Util/GenerateHtmlCombinators.hs:154 , h3 -- ./Util/GenerateHtmlCombinators.hs:154 , h4 -- ./Util/GenerateHtmlCombinators.hs:154 , h5 -- ./Util/GenerateHtmlCombinators.hs:154 , h6 -- ./Util/GenerateHtmlCombinators.hs:154 , head -- ./Util/GenerateHtmlCombinators.hs:154 , hr -- ./Util/GenerateHtmlCombinators.hs:154 , html -- ./Util/GenerateHtmlCombinators.hs:154 , i -- ./Util/GenerateHtmlCombinators.hs:154 , img -- ./Util/GenerateHtmlCombinators.hs:154 , input -- ./Util/GenerateHtmlCombinators.hs:154 , ins -- ./Util/GenerateHtmlCombinators.hs:154 , kbd -- ./Util/GenerateHtmlCombinators.hs:154 , label -- ./Util/GenerateHtmlCombinators.hs:154 , legend -- ./Util/GenerateHtmlCombinators.hs:154 , li -- ./Util/GenerateHtmlCombinators.hs:154 , link -- ./Util/GenerateHtmlCombinators.hs:154 , map -- ./Util/GenerateHtmlCombinators.hs:154 , meta -- ./Util/GenerateHtmlCombinators.hs:154 , noscript -- ./Util/GenerateHtmlCombinators.hs:154 , object -- ./Util/GenerateHtmlCombinators.hs:154 , ol -- ./Util/GenerateHtmlCombinators.hs:154 , optgroup -- ./Util/GenerateHtmlCombinators.hs:154 , option -- ./Util/GenerateHtmlCombinators.hs:154 , p -- ./Util/GenerateHtmlCombinators.hs:154 , param -- ./Util/GenerateHtmlCombinators.hs:154 , pre -- ./Util/GenerateHtmlCombinators.hs:154 , q -- ./Util/GenerateHtmlCombinators.hs:154 , samp -- ./Util/GenerateHtmlCombinators.hs:154 , script -- ./Util/GenerateHtmlCombinators.hs:154 , select -- ./Util/GenerateHtmlCombinators.hs:154 , small -- ./Util/GenerateHtmlCombinators.hs:154 , span -- ./Util/GenerateHtmlCombinators.hs:154 , strong -- ./Util/GenerateHtmlCombinators.hs:154 , style -- ./Util/GenerateHtmlCombinators.hs:154 , sub -- ./Util/GenerateHtmlCombinators.hs:154 , sup -- ./Util/GenerateHtmlCombinators.hs:154 , table -- ./Util/GenerateHtmlCombinators.hs:154 , tbody -- ./Util/GenerateHtmlCombinators.hs:154 , td -- ./Util/GenerateHtmlCombinators.hs:154 , textarea -- ./Util/GenerateHtmlCombinators.hs:154 , tfoot -- ./Util/GenerateHtmlCombinators.hs:154 , th -- ./Util/GenerateHtmlCombinators.hs:154 , thead -- ./Util/GenerateHtmlCombinators.hs:154 , title -- ./Util/GenerateHtmlCombinators.hs:154 , tr -- ./Util/GenerateHtmlCombinators.hs:154 , tt -- ./Util/GenerateHtmlCombinators.hs:154 , ul -- ./Util/GenerateHtmlCombinators.hs:154 , var -- ./Util/GenerateHtmlCombinators.hs:154 ) where -- ./Util/GenerateHtmlCombinators.hs:155 import Prelude ((>>), (.)) -- ./Util/GenerateHtmlCombinators.hs:85 -- ./Util/GenerateHtmlCombinators.hs:86 import Text.Blaze -- ./Util/GenerateHtmlCombinators.hs:87 import Text.Blaze.Internal -- ./Util/GenerateHtmlCombinators.hs:88 -- ./Util/GenerateHtmlCombinators.hs:89 -- | Combinator for the document type. This should be placed at the top -- of every HTML page. -- -- Example: -- -- > docType -- -- Result: -- -- > "http://www.w3.org/TR/html4/strict.dtd"> -- docType :: Html -- ^ The document type HTML. -- ./Util/GenerateHtmlCombinators.hs:171 docType = preEscapedText "\n" -- ./Util/GenerateHtmlCombinators.hs:172 {-# INLINE docType #-} -- ./Util/GenerateHtmlCombinators.hs:173 -- | Combinator for the @\@ element. This combinator will also -- insert the correct doctype. -- -- Example: -- -- > docTypeHtml $ span $ text "foo" -- -- Result: -- -- > "http://www.w3.org/TR/html4/strict.dtd"> -- > foo -- docTypeHtml :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:192 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:193 docTypeHtml inner = docType >> html inner -- ./Util/GenerateHtmlCombinators.hs:194 {-# INLINE docTypeHtml #-} -- ./Util/GenerateHtmlCombinators.hs:195 -- | Combinator for the @\@ element. -- -- Example: -- -- > a $ span $ text "foo" -- -- Result: -- -- > foo -- a :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 a = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE a #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\@ element. -- -- Example: -- -- > abbr $ span $ text "foo" -- -- Result: -- -- > foo -- abbr :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 abbr = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE abbr #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\@ element. -- -- Example: -- -- > acronym $ span $ text "foo" -- -- Result: -- -- > foo -- acronym :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 acronym = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE acronym #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\
@ element. -- -- Example: -- -- > address $ span $ text "foo" -- -- Result: -- -- >
foo
-- address :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 address = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE address #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\@ element. -- -- Example: -- -- > area -- -- Result: -- -- > -- area :: Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:238 area = Leaf "" -- ./Util/GenerateHtmlCombinators.hs:239 {-# INLINE area #-} -- ./Util/GenerateHtmlCombinators.hs:240 -- | Combinator for the @\@ element. -- -- Example: -- -- > b $ span $ text "foo" -- -- Result: -- -- > foo -- b :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 b = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE b #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\@ element. -- -- Example: -- -- > bdo $ span $ text "foo" -- -- Result: -- -- > foo -- bdo :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 bdo = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE bdo #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\@ element. -- -- Example: -- -- > big $ span $ text "foo" -- -- Result: -- -- > foo -- big :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 big = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE big #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\
@ element. -- -- Example: -- -- > blockquote $ span $ text "foo" -- -- Result: -- -- >
foo
-- blockquote :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 blockquote = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE blockquote #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\@ element. -- -- Example: -- -- > body $ span $ text "foo" -- -- Result: -- -- > foo -- body :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 body = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE body #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\
@ element. -- -- Example: -- -- > br -- -- Result: -- -- >
-- br :: Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:238 br = Leaf "" -- ./Util/GenerateHtmlCombinators.hs:239 {-# INLINE br #-} -- ./Util/GenerateHtmlCombinators.hs:240 -- | Combinator for the @\ -- button :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 button = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE button #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\@ element. -- -- Example: -- -- > caption $ span $ text "foo" -- -- Result: -- -- > foo -- caption :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 caption = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE caption #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\@ element. -- -- Example: -- -- > cite $ span $ text "foo" -- -- Result: -- -- > foo -- cite :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 cite = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE cite #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\@ element. -- -- Example: -- -- > code $ span $ text "foo" -- -- Result: -- -- > foo -- code :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 code = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE code #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\@ element. -- -- Example: -- -- > col -- -- Result: -- -- > -- col :: Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:238 col = Leaf "" -- ./Util/GenerateHtmlCombinators.hs:239 {-# INLINE col #-} -- ./Util/GenerateHtmlCombinators.hs:240 -- | Combinator for the @\@ element. -- -- Example: -- -- > colgroup $ span $ text "foo" -- -- Result: -- -- > foo -- colgroup :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 colgroup = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE colgroup #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\
@ element. -- -- Example: -- -- > dd $ span $ text "foo" -- -- Result: -- -- >
foo
-- dd :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 dd = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE dd #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\@ element. -- -- Example: -- -- > del $ span $ text "foo" -- -- Result: -- -- > foo -- del :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 del = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE del #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\@ element. -- -- Example: -- -- > dfn $ span $ text "foo" -- -- Result: -- -- > foo -- dfn :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 dfn = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE dfn #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\
@ element. -- -- Example: -- -- > div $ span $ text "foo" -- -- Result: -- -- >
foo
-- div :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 div = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE div #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\
@ element. -- -- Example: -- -- > dl $ span $ text "foo" -- -- Result: -- -- >
foo
-- dl :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 dl = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE dl #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\
@ element. -- -- Example: -- -- > dt $ span $ text "foo" -- -- Result: -- -- >
foo
-- dt :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 dt = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE dt #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\@ element. -- -- Example: -- -- > em $ span $ text "foo" -- -- Result: -- -- > foo -- em :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 em = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE em #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\
@ element. -- -- Example: -- -- > fieldset $ span $ text "foo" -- -- Result: -- -- >
foo
-- fieldset :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 fieldset = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE fieldset #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\
@ element. -- -- Example: -- -- > form $ span $ text "foo" -- -- Result: -- -- > foo
-- form :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 form = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE form #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\

@ element. -- -- Example: -- -- > h1 $ span $ text "foo" -- -- Result: -- -- >

foo

-- h1 :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 h1 = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE h1 #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\

@ element. -- -- Example: -- -- > h2 $ span $ text "foo" -- -- Result: -- -- >

foo

-- h2 :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 h2 = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE h2 #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\

@ element. -- -- Example: -- -- > h3 $ span $ text "foo" -- -- Result: -- -- >

foo

-- h3 :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 h3 = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE h3 #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\

@ element. -- -- Example: -- -- > h4 $ span $ text "foo" -- -- Result: -- -- >

foo

-- h4 :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 h4 = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE h4 #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\
@ element. -- -- Example: -- -- > h5 $ span $ text "foo" -- -- Result: -- -- >
foo
-- h5 :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 h5 = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE h5 #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\
@ element. -- -- Example: -- -- > h6 $ span $ text "foo" -- -- Result: -- -- >
foo
-- h6 :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 h6 = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE h6 #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\@ element. -- -- Example: -- -- > head $ span $ text "foo" -- -- Result: -- -- > foo -- head :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 head = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE head #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\
@ element. -- -- Example: -- -- > hr -- -- Result: -- -- >
-- hr :: Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:238 hr = Leaf "" -- ./Util/GenerateHtmlCombinators.hs:239 {-# INLINE hr #-} -- ./Util/GenerateHtmlCombinators.hs:240 -- | Combinator for the @\@ element. -- -- Example: -- -- > html $ span $ text "foo" -- -- Result: -- -- > foo -- html :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 html = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE html #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\@ element. -- -- Example: -- -- > i $ span $ text "foo" -- -- Result: -- -- > foo -- i :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 i = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE i #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\@ element. -- -- Example: -- -- > img -- -- Result: -- -- > -- img :: Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:238 img = Leaf "" -- ./Util/GenerateHtmlCombinators.hs:239 {-# INLINE img #-} -- ./Util/GenerateHtmlCombinators.hs:240 -- | Combinator for the @\@ element. -- -- Example: -- -- > input -- -- Result: -- -- > -- input :: Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:238 input = Leaf "" -- ./Util/GenerateHtmlCombinators.hs:239 {-# INLINE input #-} -- ./Util/GenerateHtmlCombinators.hs:240 -- | Combinator for the @\@ element. -- -- Example: -- -- > ins $ span $ text "foo" -- -- Result: -- -- > foo -- ins :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 ins = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE ins #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\@ element. -- -- Example: -- -- > kbd $ span $ text "foo" -- -- Result: -- -- > foo -- kbd :: Html -- ^ Inner HTML. -- ./Util/GenerateHtmlCombinators.hs:212 -> Html -- ^ Resulting HTML. -- ./Util/GenerateHtmlCombinators.hs:213 kbd = Parent "" -- ./Util/GenerateHtmlCombinators.hs:214 {-# INLINE kbd #-} -- ./Util/GenerateHtmlCombinators.hs:216 -- | Combinator for the @\