-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:94
--
-- | This module exports combinators that provide you with the
-- ability to set attributes on HTML elements.
--
{-# LANGUAGE OverloadedStrings #-}
module Text.Blaze.Html4.FrameSet.Attributes
    ( abbr
    , accept
    , accesskey
    , action
    , align
    , alt
    , archive
    , axis
    , background
    , bgcolor
    , border
    , cellpadding
    , cellspacing
    , char
    , charoff
    , charset
    , checked
    , cite
    , class_
    , classid
    , clear
    , codebase
    , codetype
    , cols
    , colspan
    , compact
    , content
    , coords
    , data_
    , datetime
    , declare
    , defer
    , dir
    , disabled
    , enctype
    , for
    , frame
    , frameborder
    , headers
    , height
    , href
    , hreflang
    , hspace
    , httpEquiv
    , id
    , label
    , lang
    , language
    , maxlength
    , media
    , method
    , multiple
    , name
    , nohref
    , noshade
    , nowrap
    , onabort
    , onblur
    , onchange
    , onclick
    , ondblclick
    , onfocus
    , onkeydown
    , onkeypress
    , onkeyup
    , onload
    , onmousedown
    , onmousemove
    , onmouseout
    , onmouseover
    , onmouseup
    , onreset
    , onselect
    , onsubmit
    , onunload
    , profile
    , readonly
    , rel
    , rev
    , rows
    , rowspan
    , rules
    , scheme
    , scope
    , scrolling
    , selected
    , shape
    , size
    , span
    , src
    , standby
    , start
    , style
    , summary
    , tabindex
    , target
    , title
    , type_
    , usemap
    , valign
    , value
    , valuetype
    , vspace
    , width
    ) where

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

import Text.Blaze.Internal (Attribute, AttributeValue, attribute)

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @abbr@ attribute.
--
-- Example:
--
-- > div ! abbr "bar" $ "Hello."
--
-- Result:
--
-- > <div abbr="bar">Hello.</div>
--
abbr :: AttributeValue  -- ^ Attribute value.
     -> Attribute       -- ^ Resulting attribute.
abbr :: AttributeValue -> Attribute
abbr = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"abbr" Tag
" abbr=\""
{-# INLINE abbr #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @accept@ attribute.
--
-- Example:
--
-- > div ! accept "bar" $ "Hello."
--
-- Result:
--
-- > <div accept="bar">Hello.</div>
--
accept :: AttributeValue  -- ^ Attribute value.
       -> Attribute       -- ^ Resulting attribute.
accept :: AttributeValue -> Attribute
accept = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"accept" Tag
" accept=\""
{-# INLINE accept #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @accesskey@ attribute.
--
-- Example:
--
-- > div ! accesskey "bar" $ "Hello."
--
-- Result:
--
-- > <div accesskey="bar">Hello.</div>
--
accesskey :: AttributeValue  -- ^ Attribute value.
          -> Attribute       -- ^ Resulting attribute.
accesskey :: AttributeValue -> Attribute
accesskey = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"accesskey" Tag
" accesskey=\""
{-# INLINE accesskey #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @action@ attribute.
--
-- Example:
--
-- > div ! action "bar" $ "Hello."
--
-- Result:
--
-- > <div action="bar">Hello.</div>
--
action :: AttributeValue  -- ^ Attribute value.
       -> Attribute       -- ^ Resulting attribute.
action :: AttributeValue -> Attribute
action = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"action" Tag
" action=\""
{-# INLINE action #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @align@ attribute.
--
-- Example:
--
-- > div ! align "bar" $ "Hello."
--
-- Result:
--
-- > <div align="bar">Hello.</div>
--
align :: AttributeValue  -- ^ Attribute value.
      -> Attribute       -- ^ Resulting attribute.
align :: AttributeValue -> Attribute
align = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"align" Tag
" align=\""
{-# INLINE align #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @alt@ attribute.
--
-- Example:
--
-- > div ! alt "bar" $ "Hello."
--
-- Result:
--
-- > <div alt="bar">Hello.</div>
--
alt :: AttributeValue  -- ^ Attribute value.
    -> Attribute       -- ^ Resulting attribute.
alt :: AttributeValue -> Attribute
alt = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"alt" Tag
" alt=\""
{-# INLINE alt #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @archive@ attribute.
--
-- Example:
--
-- > div ! archive "bar" $ "Hello."
--
-- Result:
--
-- > <div archive="bar">Hello.</div>
--
archive :: AttributeValue  -- ^ Attribute value.
        -> Attribute       -- ^ Resulting attribute.
archive :: AttributeValue -> Attribute
archive = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"archive" Tag
" archive=\""
{-# INLINE archive #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @axis@ attribute.
--
-- Example:
--
-- > div ! axis "bar" $ "Hello."
--
-- Result:
--
-- > <div axis="bar">Hello.</div>
--
axis :: AttributeValue  -- ^ Attribute value.
     -> Attribute       -- ^ Resulting attribute.
axis :: AttributeValue -> Attribute
axis = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"axis" Tag
" axis=\""
{-# INLINE axis #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @background@ attribute.
--
-- Example:
--
-- > div ! background "bar" $ "Hello."
--
-- Result:
--
-- > <div background="bar">Hello.</div>
--
background :: AttributeValue  -- ^ Attribute value.
           -> Attribute       -- ^ Resulting attribute.
background :: AttributeValue -> Attribute
background = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"background" Tag
" background=\""
{-# INLINE background #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @bgcolor@ attribute.
--
-- Example:
--
-- > div ! bgcolor "bar" $ "Hello."
--
-- Result:
--
-- > <div bgcolor="bar">Hello.</div>
--
bgcolor :: AttributeValue  -- ^ Attribute value.
        -> Attribute       -- ^ Resulting attribute.
bgcolor :: AttributeValue -> Attribute
bgcolor = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"bgcolor" Tag
" bgcolor=\""
{-# INLINE bgcolor #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @border@ attribute.
--
-- Example:
--
-- > div ! border "bar" $ "Hello."
--
-- Result:
--
-- > <div border="bar">Hello.</div>
--
border :: AttributeValue  -- ^ Attribute value.
       -> Attribute       -- ^ Resulting attribute.
border :: AttributeValue -> Attribute
border = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"border" Tag
" border=\""
{-# INLINE border #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @cellpadding@ attribute.
--
-- Example:
--
-- > div ! cellpadding "bar" $ "Hello."
--
-- Result:
--
-- > <div cellpadding="bar">Hello.</div>
--
cellpadding :: AttributeValue  -- ^ Attribute value.
            -> Attribute       -- ^ Resulting attribute.
cellpadding :: AttributeValue -> Attribute
cellpadding = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"cellpadding" Tag
" cellpadding=\""
{-# INLINE cellpadding #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @cellspacing@ attribute.
--
-- Example:
--
-- > div ! cellspacing "bar" $ "Hello."
--
-- Result:
--
-- > <div cellspacing="bar">Hello.</div>
--
cellspacing :: AttributeValue  -- ^ Attribute value.
            -> Attribute       -- ^ Resulting attribute.
cellspacing :: AttributeValue -> Attribute
cellspacing = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"cellspacing" Tag
" cellspacing=\""
{-# INLINE cellspacing #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @char@ attribute.
--
-- Example:
--
-- > div ! char "bar" $ "Hello."
--
-- Result:
--
-- > <div char="bar">Hello.</div>
--
char :: AttributeValue  -- ^ Attribute value.
     -> Attribute       -- ^ Resulting attribute.
char :: AttributeValue -> Attribute
char = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"char" Tag
" char=\""
{-# INLINE char #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @charoff@ attribute.
--
-- Example:
--
-- > div ! charoff "bar" $ "Hello."
--
-- Result:
--
-- > <div charoff="bar">Hello.</div>
--
charoff :: AttributeValue  -- ^ Attribute value.
        -> Attribute       -- ^ Resulting attribute.
charoff :: AttributeValue -> Attribute
charoff = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"charoff" Tag
" charoff=\""
{-# INLINE charoff #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @charset@ attribute.
--
-- Example:
--
-- > div ! charset "bar" $ "Hello."
--
-- Result:
--
-- > <div charset="bar">Hello.</div>
--
charset :: AttributeValue  -- ^ Attribute value.
        -> Attribute       -- ^ Resulting attribute.
charset :: AttributeValue -> Attribute
charset = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"charset" Tag
" charset=\""
{-# INLINE charset #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @checked@ attribute.
--
-- Example:
--
-- > div ! checked "bar" $ "Hello."
--
-- Result:
--
-- > <div checked="bar">Hello.</div>
--
checked :: AttributeValue  -- ^ Attribute value.
        -> Attribute       -- ^ Resulting attribute.
checked :: AttributeValue -> Attribute
checked = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"checked" Tag
" checked=\""
{-# INLINE checked #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @cite@ attribute.
--
-- Example:
--
-- > div ! cite "bar" $ "Hello."
--
-- Result:
--
-- > <div cite="bar">Hello.</div>
--
cite :: AttributeValue  -- ^ Attribute value.
     -> Attribute       -- ^ Resulting attribute.
cite :: AttributeValue -> Attribute
cite = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"cite" Tag
" cite=\""
{-# INLINE cite #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @class@ attribute.
--
-- Example:
--
-- > div ! class_ "bar" $ "Hello."
--
-- Result:
--
-- > <div class="bar">Hello.</div>
--
class_ :: AttributeValue  -- ^ Attribute value.
       -> Attribute       -- ^ Resulting attribute.
class_ :: AttributeValue -> Attribute
class_ = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"class" Tag
" class=\""
{-# INLINE class_ #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @classid@ attribute.
--
-- Example:
--
-- > div ! classid "bar" $ "Hello."
--
-- Result:
--
-- > <div classid="bar">Hello.</div>
--
classid :: AttributeValue  -- ^ Attribute value.
        -> Attribute       -- ^ Resulting attribute.
classid :: AttributeValue -> Attribute
classid = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"classid" Tag
" classid=\""
{-# INLINE classid #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @clear@ attribute.
--
-- Example:
--
-- > div ! clear "bar" $ "Hello."
--
-- Result:
--
-- > <div clear="bar">Hello.</div>
--
clear :: AttributeValue  -- ^ Attribute value.
      -> Attribute       -- ^ Resulting attribute.
clear :: AttributeValue -> Attribute
clear = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"clear" Tag
" clear=\""
{-# INLINE clear #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @codebase@ attribute.
--
-- Example:
--
-- > div ! codebase "bar" $ "Hello."
--
-- Result:
--
-- > <div codebase="bar">Hello.</div>
--
codebase :: AttributeValue  -- ^ Attribute value.
         -> Attribute       -- ^ Resulting attribute.
codebase :: AttributeValue -> Attribute
codebase = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"codebase" Tag
" codebase=\""
{-# INLINE codebase #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @codetype@ attribute.
--
-- Example:
--
-- > div ! codetype "bar" $ "Hello."
--
-- Result:
--
-- > <div codetype="bar">Hello.</div>
--
codetype :: AttributeValue  -- ^ Attribute value.
         -> Attribute       -- ^ Resulting attribute.
codetype :: AttributeValue -> Attribute
codetype = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"codetype" Tag
" codetype=\""
{-# INLINE codetype #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @cols@ attribute.
--
-- Example:
--
-- > div ! cols "bar" $ "Hello."
--
-- Result:
--
-- > <div cols="bar">Hello.</div>
--
cols :: AttributeValue  -- ^ Attribute value.
     -> Attribute       -- ^ Resulting attribute.
cols :: AttributeValue -> Attribute
cols = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"cols" Tag
" cols=\""
{-# INLINE cols #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @colspan@ attribute.
--
-- Example:
--
-- > div ! colspan "bar" $ "Hello."
--
-- Result:
--
-- > <div colspan="bar">Hello.</div>
--
colspan :: AttributeValue  -- ^ Attribute value.
        -> Attribute       -- ^ Resulting attribute.
colspan :: AttributeValue -> Attribute
colspan = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"colspan" Tag
" colspan=\""
{-# INLINE colspan #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @compact@ attribute.
--
-- Example:
--
-- > div ! compact "bar" $ "Hello."
--
-- Result:
--
-- > <div compact="bar">Hello.</div>
--
compact :: AttributeValue  -- ^ Attribute value.
        -> Attribute       -- ^ Resulting attribute.
compact :: AttributeValue -> Attribute
compact = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"compact" Tag
" compact=\""
{-# INLINE compact #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @content@ attribute.
--
-- Example:
--
-- > div ! content "bar" $ "Hello."
--
-- Result:
--
-- > <div content="bar">Hello.</div>
--
content :: AttributeValue  -- ^ Attribute value.
        -> Attribute       -- ^ Resulting attribute.
content :: AttributeValue -> Attribute
content = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"content" Tag
" content=\""
{-# INLINE content #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @coords@ attribute.
--
-- Example:
--
-- > div ! coords "bar" $ "Hello."
--
-- Result:
--
-- > <div coords="bar">Hello.</div>
--
coords :: AttributeValue  -- ^ Attribute value.
       -> Attribute       -- ^ Resulting attribute.
coords :: AttributeValue -> Attribute
coords = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"coords" Tag
" coords=\""
{-# INLINE coords #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @data@ attribute.
--
-- Example:
--
-- > div ! data_ "bar" $ "Hello."
--
-- Result:
--
-- > <div data="bar">Hello.</div>
--
data_ :: AttributeValue  -- ^ Attribute value.
      -> Attribute       -- ^ Resulting attribute.
data_ :: AttributeValue -> Attribute
data_ = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"data" Tag
" data=\""
{-# INLINE data_ #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @datetime@ attribute.
--
-- Example:
--
-- > div ! datetime "bar" $ "Hello."
--
-- Result:
--
-- > <div datetime="bar">Hello.</div>
--
datetime :: AttributeValue  -- ^ Attribute value.
         -> Attribute       -- ^ Resulting attribute.
datetime :: AttributeValue -> Attribute
datetime = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"datetime" Tag
" datetime=\""
{-# INLINE datetime #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @declare@ attribute.
--
-- Example:
--
-- > div ! declare "bar" $ "Hello."
--
-- Result:
--
-- > <div declare="bar">Hello.</div>
--
declare :: AttributeValue  -- ^ Attribute value.
        -> Attribute       -- ^ Resulting attribute.
declare :: AttributeValue -> Attribute
declare = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"declare" Tag
" declare=\""
{-# INLINE declare #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @defer@ attribute.
--
-- Example:
--
-- > div ! defer "bar" $ "Hello."
--
-- Result:
--
-- > <div defer="bar">Hello.</div>
--
defer :: AttributeValue  -- ^ Attribute value.
      -> Attribute       -- ^ Resulting attribute.
defer :: AttributeValue -> Attribute
defer = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"defer" Tag
" defer=\""
{-# INLINE defer #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @dir@ attribute.
--
-- Example:
--
-- > div ! dir "bar" $ "Hello."
--
-- Result:
--
-- > <div dir="bar">Hello.</div>
--
dir :: AttributeValue  -- ^ Attribute value.
    -> Attribute       -- ^ Resulting attribute.
dir :: AttributeValue -> Attribute
dir = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"dir" Tag
" dir=\""
{-# INLINE dir #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @disabled@ attribute.
--
-- Example:
--
-- > div ! disabled "bar" $ "Hello."
--
-- Result:
--
-- > <div disabled="bar">Hello.</div>
--
disabled :: AttributeValue  -- ^ Attribute value.
         -> Attribute       -- ^ Resulting attribute.
disabled :: AttributeValue -> Attribute
disabled = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"disabled" Tag
" disabled=\""
{-# INLINE disabled #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @enctype@ attribute.
--
-- Example:
--
-- > div ! enctype "bar" $ "Hello."
--
-- Result:
--
-- > <div enctype="bar">Hello.</div>
--
enctype :: AttributeValue  -- ^ Attribute value.
        -> Attribute       -- ^ Resulting attribute.
enctype :: AttributeValue -> Attribute
enctype = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"enctype" Tag
" enctype=\""
{-# INLINE enctype #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @for@ attribute.
--
-- Example:
--
-- > div ! for "bar" $ "Hello."
--
-- Result:
--
-- > <div for="bar">Hello.</div>
--
for :: AttributeValue  -- ^ Attribute value.
    -> Attribute       -- ^ Resulting attribute.
for :: AttributeValue -> Attribute
for = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"for" Tag
" for=\""
{-# INLINE for #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @frame@ attribute.
--
-- Example:
--
-- > div ! frame "bar" $ "Hello."
--
-- Result:
--
-- > <div frame="bar">Hello.</div>
--
frame :: AttributeValue  -- ^ Attribute value.
      -> Attribute       -- ^ Resulting attribute.
frame :: AttributeValue -> Attribute
frame = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"frame" Tag
" frame=\""
{-# INLINE frame #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @frameborder@ attribute.
--
-- Example:
--
-- > div ! frameborder "bar" $ "Hello."
--
-- Result:
--
-- > <div frameborder="bar">Hello.</div>
--
frameborder :: AttributeValue  -- ^ Attribute value.
            -> Attribute       -- ^ Resulting attribute.
frameborder :: AttributeValue -> Attribute
frameborder = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"frameborder" Tag
" frameborder=\""
{-# INLINE frameborder #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @headers@ attribute.
--
-- Example:
--
-- > div ! headers "bar" $ "Hello."
--
-- Result:
--
-- > <div headers="bar">Hello.</div>
--
headers :: AttributeValue  -- ^ Attribute value.
        -> Attribute       -- ^ Resulting attribute.
headers :: AttributeValue -> Attribute
headers = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"headers" Tag
" headers=\""
{-# INLINE headers #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @height@ attribute.
--
-- Example:
--
-- > div ! height "bar" $ "Hello."
--
-- Result:
--
-- > <div height="bar">Hello.</div>
--
height :: AttributeValue  -- ^ Attribute value.
       -> Attribute       -- ^ Resulting attribute.
height :: AttributeValue -> Attribute
height = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"height" Tag
" height=\""
{-# INLINE height #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @href@ attribute.
--
-- Example:
--
-- > div ! href "bar" $ "Hello."
--
-- Result:
--
-- > <div href="bar">Hello.</div>
--
href :: AttributeValue  -- ^ Attribute value.
     -> Attribute       -- ^ Resulting attribute.
href :: AttributeValue -> Attribute
href = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"href" Tag
" href=\""
{-# INLINE href #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @hreflang@ attribute.
--
-- Example:
--
-- > div ! hreflang "bar" $ "Hello."
--
-- Result:
--
-- > <div hreflang="bar">Hello.</div>
--
hreflang :: AttributeValue  -- ^ Attribute value.
         -> Attribute       -- ^ Resulting attribute.
hreflang :: AttributeValue -> Attribute
hreflang = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"hreflang" Tag
" hreflang=\""
{-# INLINE hreflang #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @hspace@ attribute.
--
-- Example:
--
-- > div ! hspace "bar" $ "Hello."
--
-- Result:
--
-- > <div hspace="bar">Hello.</div>
--
hspace :: AttributeValue  -- ^ Attribute value.
       -> Attribute       -- ^ Resulting attribute.
hspace :: AttributeValue -> Attribute
hspace = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"hspace" Tag
" hspace=\""
{-# INLINE hspace #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @http-equiv@ attribute.
--
-- Example:
--
-- > div ! httpEquiv "bar" $ "Hello."
--
-- Result:
--
-- > <div http-equiv="bar">Hello.</div>
--
httpEquiv :: AttributeValue  -- ^ Attribute value.
          -> Attribute       -- ^ Resulting attribute.
httpEquiv :: AttributeValue -> Attribute
httpEquiv = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"http-equiv" Tag
" http-equiv=\""
{-# INLINE httpEquiv #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @id@ attribute.
--
-- Example:
--
-- > div ! id "bar" $ "Hello."
--
-- Result:
--
-- > <div id="bar">Hello.</div>
--
id :: AttributeValue  -- ^ Attribute value.
   -> Attribute       -- ^ Resulting attribute.
id :: AttributeValue -> Attribute
id = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"id" Tag
" id=\""
{-# INLINE id #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @label@ attribute.
--
-- Example:
--
-- > div ! label "bar" $ "Hello."
--
-- Result:
--
-- > <div label="bar">Hello.</div>
--
label :: AttributeValue  -- ^ Attribute value.
      -> Attribute       -- ^ Resulting attribute.
label :: AttributeValue -> Attribute
label = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"label" Tag
" label=\""
{-# INLINE label #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @lang@ attribute.
--
-- Example:
--
-- > div ! lang "bar" $ "Hello."
--
-- Result:
--
-- > <div lang="bar">Hello.</div>
--
lang :: AttributeValue  -- ^ Attribute value.
     -> Attribute       -- ^ Resulting attribute.
lang :: AttributeValue -> Attribute
lang = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"lang" Tag
" lang=\""
{-# INLINE lang #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @language@ attribute.
--
-- Example:
--
-- > div ! language "bar" $ "Hello."
--
-- Result:
--
-- > <div language="bar">Hello.</div>
--
language :: AttributeValue  -- ^ Attribute value.
         -> Attribute       -- ^ Resulting attribute.
language :: AttributeValue -> Attribute
language = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"language" Tag
" language=\""
{-# INLINE language #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @maxlength@ attribute.
--
-- Example:
--
-- > div ! maxlength "bar" $ "Hello."
--
-- Result:
--
-- > <div maxlength="bar">Hello.</div>
--
maxlength :: AttributeValue  -- ^ Attribute value.
          -> Attribute       -- ^ Resulting attribute.
maxlength :: AttributeValue -> Attribute
maxlength = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"maxlength" Tag
" maxlength=\""
{-# INLINE maxlength #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @media@ attribute.
--
-- Example:
--
-- > div ! media "bar" $ "Hello."
--
-- Result:
--
-- > <div media="bar">Hello.</div>
--
media :: AttributeValue  -- ^ Attribute value.
      -> Attribute       -- ^ Resulting attribute.
media :: AttributeValue -> Attribute
media = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"media" Tag
" media=\""
{-# INLINE media #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @method@ attribute.
--
-- Example:
--
-- > div ! method "bar" $ "Hello."
--
-- Result:
--
-- > <div method="bar">Hello.</div>
--
method :: AttributeValue  -- ^ Attribute value.
       -> Attribute       -- ^ Resulting attribute.
method :: AttributeValue -> Attribute
method = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"method" Tag
" method=\""
{-# INLINE method #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @multiple@ attribute.
--
-- Example:
--
-- > div ! multiple "bar" $ "Hello."
--
-- Result:
--
-- > <div multiple="bar">Hello.</div>
--
multiple :: AttributeValue  -- ^ Attribute value.
         -> Attribute       -- ^ Resulting attribute.
multiple :: AttributeValue -> Attribute
multiple = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"multiple" Tag
" multiple=\""
{-# INLINE multiple #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @name@ attribute.
--
-- Example:
--
-- > div ! name "bar" $ "Hello."
--
-- Result:
--
-- > <div name="bar">Hello.</div>
--
name :: AttributeValue  -- ^ Attribute value.
     -> Attribute       -- ^ Resulting attribute.
name :: AttributeValue -> Attribute
name = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"name" Tag
" name=\""
{-# INLINE name #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @nohref@ attribute.
--
-- Example:
--
-- > div ! nohref "bar" $ "Hello."
--
-- Result:
--
-- > <div nohref="bar">Hello.</div>
--
nohref :: AttributeValue  -- ^ Attribute value.
       -> Attribute       -- ^ Resulting attribute.
nohref :: AttributeValue -> Attribute
nohref = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"nohref" Tag
" nohref=\""
{-# INLINE nohref #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @noshade@ attribute.
--
-- Example:
--
-- > div ! noshade "bar" $ "Hello."
--
-- Result:
--
-- > <div noshade="bar">Hello.</div>
--
noshade :: AttributeValue  -- ^ Attribute value.
        -> Attribute       -- ^ Resulting attribute.
noshade :: AttributeValue -> Attribute
noshade = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"noshade" Tag
" noshade=\""
{-# INLINE noshade #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @nowrap@ attribute.
--
-- Example:
--
-- > div ! nowrap "bar" $ "Hello."
--
-- Result:
--
-- > <div nowrap="bar">Hello.</div>
--
nowrap :: AttributeValue  -- ^ Attribute value.
       -> Attribute       -- ^ Resulting attribute.
nowrap :: AttributeValue -> Attribute
nowrap = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"nowrap" Tag
" nowrap=\""
{-# INLINE nowrap #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @onabort@ attribute.
--
-- Example:
--
-- > div ! onabort "bar" $ "Hello."
--
-- Result:
--
-- > <div onabort="bar">Hello.</div>
--
onabort :: AttributeValue  -- ^ Attribute value.
        -> Attribute       -- ^ Resulting attribute.
onabort :: AttributeValue -> Attribute
onabort = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"onabort" Tag
" onabort=\""
{-# INLINE onabort #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @onblur@ attribute.
--
-- Example:
--
-- > div ! onblur "bar" $ "Hello."
--
-- Result:
--
-- > <div onblur="bar">Hello.</div>
--
onblur :: AttributeValue  -- ^ Attribute value.
       -> Attribute       -- ^ Resulting attribute.
onblur :: AttributeValue -> Attribute
onblur = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"onblur" Tag
" onblur=\""
{-# INLINE onblur #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @onchange@ attribute.
--
-- Example:
--
-- > div ! onchange "bar" $ "Hello."
--
-- Result:
--
-- > <div onchange="bar">Hello.</div>
--
onchange :: AttributeValue  -- ^ Attribute value.
         -> Attribute       -- ^ Resulting attribute.
onchange :: AttributeValue -> Attribute
onchange = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"onchange" Tag
" onchange=\""
{-# INLINE onchange #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @onclick@ attribute.
--
-- Example:
--
-- > div ! onclick "bar" $ "Hello."
--
-- Result:
--
-- > <div onclick="bar">Hello.</div>
--
onclick :: AttributeValue  -- ^ Attribute value.
        -> Attribute       -- ^ Resulting attribute.
onclick :: AttributeValue -> Attribute
onclick = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"onclick" Tag
" onclick=\""
{-# INLINE onclick #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @ondblclick@ attribute.
--
-- Example:
--
-- > div ! ondblclick "bar" $ "Hello."
--
-- Result:
--
-- > <div ondblclick="bar">Hello.</div>
--
ondblclick :: AttributeValue  -- ^ Attribute value.
           -> Attribute       -- ^ Resulting attribute.
ondblclick :: AttributeValue -> Attribute
ondblclick = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"ondblclick" Tag
" ondblclick=\""
{-# INLINE ondblclick #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @onfocus@ attribute.
--
-- Example:
--
-- > div ! onfocus "bar" $ "Hello."
--
-- Result:
--
-- > <div onfocus="bar">Hello.</div>
--
onfocus :: AttributeValue  -- ^ Attribute value.
        -> Attribute       -- ^ Resulting attribute.
onfocus :: AttributeValue -> Attribute
onfocus = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"onfocus" Tag
" onfocus=\""
{-# INLINE onfocus #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @onkeydown@ attribute.
--
-- Example:
--
-- > div ! onkeydown "bar" $ "Hello."
--
-- Result:
--
-- > <div onkeydown="bar">Hello.</div>
--
onkeydown :: AttributeValue  -- ^ Attribute value.
          -> Attribute       -- ^ Resulting attribute.
onkeydown :: AttributeValue -> Attribute
onkeydown = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"onkeydown" Tag
" onkeydown=\""
{-# INLINE onkeydown #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @onkeypress@ attribute.
--
-- Example:
--
-- > div ! onkeypress "bar" $ "Hello."
--
-- Result:
--
-- > <div onkeypress="bar">Hello.</div>
--
onkeypress :: AttributeValue  -- ^ Attribute value.
           -> Attribute       -- ^ Resulting attribute.
onkeypress :: AttributeValue -> Attribute
onkeypress = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"onkeypress" Tag
" onkeypress=\""
{-# INLINE onkeypress #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @onkeyup@ attribute.
--
-- Example:
--
-- > div ! onkeyup "bar" $ "Hello."
--
-- Result:
--
-- > <div onkeyup="bar">Hello.</div>
--
onkeyup :: AttributeValue  -- ^ Attribute value.
        -> Attribute       -- ^ Resulting attribute.
onkeyup :: AttributeValue -> Attribute
onkeyup = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"onkeyup" Tag
" onkeyup=\""
{-# INLINE onkeyup #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @onload@ attribute.
--
-- Example:
--
-- > div ! onload "bar" $ "Hello."
--
-- Result:
--
-- > <div onload="bar">Hello.</div>
--
onload :: AttributeValue  -- ^ Attribute value.
       -> Attribute       -- ^ Resulting attribute.
onload :: AttributeValue -> Attribute
onload = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"onload" Tag
" onload=\""
{-# INLINE onload #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @onmousedown@ attribute.
--
-- Example:
--
-- > div ! onmousedown "bar" $ "Hello."
--
-- Result:
--
-- > <div onmousedown="bar">Hello.</div>
--
onmousedown :: AttributeValue  -- ^ Attribute value.
            -> Attribute       -- ^ Resulting attribute.
onmousedown :: AttributeValue -> Attribute
onmousedown = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"onmousedown" Tag
" onmousedown=\""
{-# INLINE onmousedown #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @onmousemove@ attribute.
--
-- Example:
--
-- > div ! onmousemove "bar" $ "Hello."
--
-- Result:
--
-- > <div onmousemove="bar">Hello.</div>
--
onmousemove :: AttributeValue  -- ^ Attribute value.
            -> Attribute       -- ^ Resulting attribute.
onmousemove :: AttributeValue -> Attribute
onmousemove = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"onmousemove" Tag
" onmousemove=\""
{-# INLINE onmousemove #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @onmouseout@ attribute.
--
-- Example:
--
-- > div ! onmouseout "bar" $ "Hello."
--
-- Result:
--
-- > <div onmouseout="bar">Hello.</div>
--
onmouseout :: AttributeValue  -- ^ Attribute value.
           -> Attribute       -- ^ Resulting attribute.
onmouseout :: AttributeValue -> Attribute
onmouseout = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"onmouseout" Tag
" onmouseout=\""
{-# INLINE onmouseout #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @onmouseover@ attribute.
--
-- Example:
--
-- > div ! onmouseover "bar" $ "Hello."
--
-- Result:
--
-- > <div onmouseover="bar">Hello.</div>
--
onmouseover :: AttributeValue  -- ^ Attribute value.
            -> Attribute       -- ^ Resulting attribute.
onmouseover :: AttributeValue -> Attribute
onmouseover = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"onmouseover" Tag
" onmouseover=\""
{-# INLINE onmouseover #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @onmouseup@ attribute.
--
-- Example:
--
-- > div ! onmouseup "bar" $ "Hello."
--
-- Result:
--
-- > <div onmouseup="bar">Hello.</div>
--
onmouseup :: AttributeValue  -- ^ Attribute value.
          -> Attribute       -- ^ Resulting attribute.
onmouseup :: AttributeValue -> Attribute
onmouseup = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"onmouseup" Tag
" onmouseup=\""
{-# INLINE onmouseup #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @onreset@ attribute.
--
-- Example:
--
-- > div ! onreset "bar" $ "Hello."
--
-- Result:
--
-- > <div onreset="bar">Hello.</div>
--
onreset :: AttributeValue  -- ^ Attribute value.
        -> Attribute       -- ^ Resulting attribute.
onreset :: AttributeValue -> Attribute
onreset = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"onreset" Tag
" onreset=\""
{-# INLINE onreset #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @onselect@ attribute.
--
-- Example:
--
-- > div ! onselect "bar" $ "Hello."
--
-- Result:
--
-- > <div onselect="bar">Hello.</div>
--
onselect :: AttributeValue  -- ^ Attribute value.
         -> Attribute       -- ^ Resulting attribute.
onselect :: AttributeValue -> Attribute
onselect = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"onselect" Tag
" onselect=\""
{-# INLINE onselect #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @onsubmit@ attribute.
--
-- Example:
--
-- > div ! onsubmit "bar" $ "Hello."
--
-- Result:
--
-- > <div onsubmit="bar">Hello.</div>
--
onsubmit :: AttributeValue  -- ^ Attribute value.
         -> Attribute       -- ^ Resulting attribute.
onsubmit :: AttributeValue -> Attribute
onsubmit = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"onsubmit" Tag
" onsubmit=\""
{-# INLINE onsubmit #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @onunload@ attribute.
--
-- Example:
--
-- > div ! onunload "bar" $ "Hello."
--
-- Result:
--
-- > <div onunload="bar">Hello.</div>
--
onunload :: AttributeValue  -- ^ Attribute value.
         -> Attribute       -- ^ Resulting attribute.
onunload :: AttributeValue -> Attribute
onunload = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"onunload" Tag
" onunload=\""
{-# INLINE onunload #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @profile@ attribute.
--
-- Example:
--
-- > div ! profile "bar" $ "Hello."
--
-- Result:
--
-- > <div profile="bar">Hello.</div>
--
profile :: AttributeValue  -- ^ Attribute value.
        -> Attribute       -- ^ Resulting attribute.
profile :: AttributeValue -> Attribute
profile = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"profile" Tag
" profile=\""
{-# INLINE profile #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @readonly@ attribute.
--
-- Example:
--
-- > div ! readonly "bar" $ "Hello."
--
-- Result:
--
-- > <div readonly="bar">Hello.</div>
--
readonly :: AttributeValue  -- ^ Attribute value.
         -> Attribute       -- ^ Resulting attribute.
readonly :: AttributeValue -> Attribute
readonly = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"readonly" Tag
" readonly=\""
{-# INLINE readonly #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @rel@ attribute.
--
-- Example:
--
-- > div ! rel "bar" $ "Hello."
--
-- Result:
--
-- > <div rel="bar">Hello.</div>
--
rel :: AttributeValue  -- ^ Attribute value.
    -> Attribute       -- ^ Resulting attribute.
rel :: AttributeValue -> Attribute
rel = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"rel" Tag
" rel=\""
{-# INLINE rel #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @rev@ attribute.
--
-- Example:
--
-- > div ! rev "bar" $ "Hello."
--
-- Result:
--
-- > <div rev="bar">Hello.</div>
--
rev :: AttributeValue  -- ^ Attribute value.
    -> Attribute       -- ^ Resulting attribute.
rev :: AttributeValue -> Attribute
rev = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"rev" Tag
" rev=\""
{-# INLINE rev #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @rows@ attribute.
--
-- Example:
--
-- > div ! rows "bar" $ "Hello."
--
-- Result:
--
-- > <div rows="bar">Hello.</div>
--
rows :: AttributeValue  -- ^ Attribute value.
     -> Attribute       -- ^ Resulting attribute.
rows :: AttributeValue -> Attribute
rows = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"rows" Tag
" rows=\""
{-# INLINE rows #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @rowspan@ attribute.
--
-- Example:
--
-- > div ! rowspan "bar" $ "Hello."
--
-- Result:
--
-- > <div rowspan="bar">Hello.</div>
--
rowspan :: AttributeValue  -- ^ Attribute value.
        -> Attribute       -- ^ Resulting attribute.
rowspan :: AttributeValue -> Attribute
rowspan = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"rowspan" Tag
" rowspan=\""
{-# INLINE rowspan #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @rules@ attribute.
--
-- Example:
--
-- > div ! rules "bar" $ "Hello."
--
-- Result:
--
-- > <div rules="bar">Hello.</div>
--
rules :: AttributeValue  -- ^ Attribute value.
      -> Attribute       -- ^ Resulting attribute.
rules :: AttributeValue -> Attribute
rules = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"rules" Tag
" rules=\""
{-# INLINE rules #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @scheme@ attribute.
--
-- Example:
--
-- > div ! scheme "bar" $ "Hello."
--
-- Result:
--
-- > <div scheme="bar">Hello.</div>
--
scheme :: AttributeValue  -- ^ Attribute value.
       -> Attribute       -- ^ Resulting attribute.
scheme :: AttributeValue -> Attribute
scheme = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"scheme" Tag
" scheme=\""
{-# INLINE scheme #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @scope@ attribute.
--
-- Example:
--
-- > div ! scope "bar" $ "Hello."
--
-- Result:
--
-- > <div scope="bar">Hello.</div>
--
scope :: AttributeValue  -- ^ Attribute value.
      -> Attribute       -- ^ Resulting attribute.
scope :: AttributeValue -> Attribute
scope = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"scope" Tag
" scope=\""
{-# INLINE scope #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @scrolling@ attribute.
--
-- Example:
--
-- > div ! scrolling "bar" $ "Hello."
--
-- Result:
--
-- > <div scrolling="bar">Hello.</div>
--
scrolling :: AttributeValue  -- ^ Attribute value.
          -> Attribute       -- ^ Resulting attribute.
scrolling :: AttributeValue -> Attribute
scrolling = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"scrolling" Tag
" scrolling=\""
{-# INLINE scrolling #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @selected@ attribute.
--
-- Example:
--
-- > div ! selected "bar" $ "Hello."
--
-- Result:
--
-- > <div selected="bar">Hello.</div>
--
selected :: AttributeValue  -- ^ Attribute value.
         -> Attribute       -- ^ Resulting attribute.
selected :: AttributeValue -> Attribute
selected = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"selected" Tag
" selected=\""
{-# INLINE selected #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @shape@ attribute.
--
-- Example:
--
-- > div ! shape "bar" $ "Hello."
--
-- Result:
--
-- > <div shape="bar">Hello.</div>
--
shape :: AttributeValue  -- ^ Attribute value.
      -> Attribute       -- ^ Resulting attribute.
shape :: AttributeValue -> Attribute
shape = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"shape" Tag
" shape=\""
{-# INLINE shape #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @size@ attribute.
--
-- Example:
--
-- > div ! size "bar" $ "Hello."
--
-- Result:
--
-- > <div size="bar">Hello.</div>
--
size :: AttributeValue  -- ^ Attribute value.
     -> Attribute       -- ^ Resulting attribute.
size :: AttributeValue -> Attribute
size = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"size" Tag
" size=\""
{-# INLINE size #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @span@ attribute.
--
-- Example:
--
-- > div ! span "bar" $ "Hello."
--
-- Result:
--
-- > <div span="bar">Hello.</div>
--
span :: AttributeValue  -- ^ Attribute value.
     -> Attribute       -- ^ Resulting attribute.
span :: AttributeValue -> Attribute
span = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"span" Tag
" span=\""
{-# INLINE span #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @src@ attribute.
--
-- Example:
--
-- > div ! src "bar" $ "Hello."
--
-- Result:
--
-- > <div src="bar">Hello.</div>
--
src :: AttributeValue  -- ^ Attribute value.
    -> Attribute       -- ^ Resulting attribute.
src :: AttributeValue -> Attribute
src = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"src" Tag
" src=\""
{-# INLINE src #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @standby@ attribute.
--
-- Example:
--
-- > div ! standby "bar" $ "Hello."
--
-- Result:
--
-- > <div standby="bar">Hello.</div>
--
standby :: AttributeValue  -- ^ Attribute value.
        -> Attribute       -- ^ Resulting attribute.
standby :: AttributeValue -> Attribute
standby = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"standby" Tag
" standby=\""
{-# INLINE standby #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @start@ attribute.
--
-- Example:
--
-- > div ! start "bar" $ "Hello."
--
-- Result:
--
-- > <div start="bar">Hello.</div>
--
start :: AttributeValue  -- ^ Attribute value.
      -> Attribute       -- ^ Resulting attribute.
start :: AttributeValue -> Attribute
start = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"start" Tag
" start=\""
{-# INLINE start #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @style@ attribute.
--
-- Example:
--
-- > div ! style "bar" $ "Hello."
--
-- Result:
--
-- > <div style="bar">Hello.</div>
--
style :: AttributeValue  -- ^ Attribute value.
      -> Attribute       -- ^ Resulting attribute.
style :: AttributeValue -> Attribute
style = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"style" Tag
" style=\""
{-# INLINE style #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @summary@ attribute.
--
-- Example:
--
-- > div ! summary "bar" $ "Hello."
--
-- Result:
--
-- > <div summary="bar">Hello.</div>
--
summary :: AttributeValue  -- ^ Attribute value.
        -> Attribute       -- ^ Resulting attribute.
summary :: AttributeValue -> Attribute
summary = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"summary" Tag
" summary=\""
{-# INLINE summary #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @tabindex@ attribute.
--
-- Example:
--
-- > div ! tabindex "bar" $ "Hello."
--
-- Result:
--
-- > <div tabindex="bar">Hello.</div>
--
tabindex :: AttributeValue  -- ^ Attribute value.
         -> Attribute       -- ^ Resulting attribute.
tabindex :: AttributeValue -> Attribute
tabindex = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"tabindex" Tag
" tabindex=\""
{-# INLINE tabindex #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @target@ attribute.
--
-- Example:
--
-- > div ! target "bar" $ "Hello."
--
-- Result:
--
-- > <div target="bar">Hello.</div>
--
target :: AttributeValue  -- ^ Attribute value.
       -> Attribute       -- ^ Resulting attribute.
target :: AttributeValue -> Attribute
target = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"target" Tag
" target=\""
{-# INLINE target #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @title@ attribute.
--
-- Example:
--
-- > div ! title "bar" $ "Hello."
--
-- Result:
--
-- > <div title="bar">Hello.</div>
--
title :: AttributeValue  -- ^ Attribute value.
      -> Attribute       -- ^ Resulting attribute.
title :: AttributeValue -> Attribute
title = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"title" Tag
" title=\""
{-# INLINE title #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @type@ attribute.
--
-- Example:
--
-- > div ! type_ "bar" $ "Hello."
--
-- Result:
--
-- > <div type="bar">Hello.</div>
--
type_ :: AttributeValue  -- ^ Attribute value.
      -> Attribute       -- ^ Resulting attribute.
type_ :: AttributeValue -> Attribute
type_ = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"type" Tag
" type=\""
{-# INLINE type_ #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @usemap@ attribute.
--
-- Example:
--
-- > div ! usemap "bar" $ "Hello."
--
-- Result:
--
-- > <div usemap="bar">Hello.</div>
--
usemap :: AttributeValue  -- ^ Attribute value.
       -> Attribute       -- ^ Resulting attribute.
usemap :: AttributeValue -> Attribute
usemap = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"usemap" Tag
" usemap=\""
{-# INLINE usemap #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @valign@ attribute.
--
-- Example:
--
-- > div ! valign "bar" $ "Hello."
--
-- Result:
--
-- > <div valign="bar">Hello.</div>
--
valign :: AttributeValue  -- ^ Attribute value.
       -> Attribute       -- ^ Resulting attribute.
valign :: AttributeValue -> Attribute
valign = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"valign" Tag
" valign=\""
{-# INLINE valign #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @value@ attribute.
--
-- Example:
--
-- > div ! value "bar" $ "Hello."
--
-- Result:
--
-- > <div value="bar">Hello.</div>
--
value :: AttributeValue  -- ^ Attribute value.
      -> Attribute       -- ^ Resulting attribute.
value :: AttributeValue -> Attribute
value = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"value" Tag
" value=\""
{-# INLINE value #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @valuetype@ attribute.
--
-- Example:
--
-- > div ! valuetype "bar" $ "Hello."
--
-- Result:
--
-- > <div valuetype="bar">Hello.</div>
--
valuetype :: AttributeValue  -- ^ Attribute value.
          -> Attribute       -- ^ Resulting attribute.
valuetype :: AttributeValue -> Attribute
valuetype = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"valuetype" Tag
" valuetype=\""
{-# INLINE valuetype #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @vspace@ attribute.
--
-- Example:
--
-- > div ! vspace "bar" $ "Hello."
--
-- Result:
--
-- > <div vspace="bar">Hello.</div>
--
vspace :: AttributeValue  -- ^ Attribute value.
       -> Attribute       -- ^ Resulting attribute.
vspace :: AttributeValue -> Attribute
vspace = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"vspace" Tag
" vspace=\""
{-# INLINE vspace #-}

-- WARNING: The next block of code was automatically generated by
-- src/Util/GenerateHtmlCombinators.hs:250
--
-- | Combinator for the @width@ attribute.
--
-- Example:
--
-- > div ! width "bar" $ "Hello."
--
-- Result:
--
-- > <div width="bar">Hello.</div>
--
width :: AttributeValue  -- ^ Attribute value.
      -> Attribute       -- ^ Resulting attribute.
width :: AttributeValue -> Attribute
width = Tag -> Tag -> AttributeValue -> Attribute
attribute Tag
"width" Tag
" width=\""
{-# INLINE width #-}