-- 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.

-- | This module exports combinators that provide you with the
-- ability to set attributes on HTML elements.
--
{-# LANGUAGE OverloadedStrings #-}                                              -- ./Util/GenerateHtmlCombinators.hs:103
module Text.Blaze.Html5.Attributes                                              -- ./Util/GenerateHtmlCombinators.hs:151
    ( accept                                                                    -- ./Util/GenerateHtmlCombinators.hs:152
    , accept_charset                                                            -- ./Util/GenerateHtmlCombinators.hs:154
    , accesskey                                                                 -- ./Util/GenerateHtmlCombinators.hs:154
    , action                                                                    -- ./Util/GenerateHtmlCombinators.hs:154
    , alt                                                                       -- ./Util/GenerateHtmlCombinators.hs:154
    , async                                                                     -- ./Util/GenerateHtmlCombinators.hs:154
    , autocomplete                                                              -- ./Util/GenerateHtmlCombinators.hs:154
    , autofocus                                                                 -- ./Util/GenerateHtmlCombinators.hs:154
    , autoplay                                                                  -- ./Util/GenerateHtmlCombinators.hs:154
    , challenge                                                                 -- ./Util/GenerateHtmlCombinators.hs:154
    , charset                                                                   -- ./Util/GenerateHtmlCombinators.hs:154
    , checked                                                                   -- ./Util/GenerateHtmlCombinators.hs:154
    , cite                                                                      -- ./Util/GenerateHtmlCombinators.hs:154
    , class_                                                                    -- ./Util/GenerateHtmlCombinators.hs:154
    , cols                                                                      -- ./Util/GenerateHtmlCombinators.hs:154
    , colspan                                                                   -- ./Util/GenerateHtmlCombinators.hs:154
    , content                                                                   -- ./Util/GenerateHtmlCombinators.hs:154
    , contenteditable                                                           -- ./Util/GenerateHtmlCombinators.hs:154
    , contextmenu                                                               -- ./Util/GenerateHtmlCombinators.hs:154
    , controls                                                                  -- ./Util/GenerateHtmlCombinators.hs:154
    , coords                                                                    -- ./Util/GenerateHtmlCombinators.hs:154
    , data_                                                                     -- ./Util/GenerateHtmlCombinators.hs:154
    , datetime                                                                  -- ./Util/GenerateHtmlCombinators.hs:154
    , defer                                                                     -- ./Util/GenerateHtmlCombinators.hs:154
    , dir                                                                       -- ./Util/GenerateHtmlCombinators.hs:154
    , disabled                                                                  -- ./Util/GenerateHtmlCombinators.hs:154
    , draggable                                                                 -- ./Util/GenerateHtmlCombinators.hs:154
    , enctype                                                                   -- ./Util/GenerateHtmlCombinators.hs:154
    , for                                                                       -- ./Util/GenerateHtmlCombinators.hs:154
    , form                                                                      -- ./Util/GenerateHtmlCombinators.hs:154
    , formaction                                                                -- ./Util/GenerateHtmlCombinators.hs:154
    , formenctype                                                               -- ./Util/GenerateHtmlCombinators.hs:154
    , formmethod                                                                -- ./Util/GenerateHtmlCombinators.hs:154
    , formnovalidate                                                            -- ./Util/GenerateHtmlCombinators.hs:154
    , formtarget                                                                -- ./Util/GenerateHtmlCombinators.hs:154
    , headers                                                                   -- ./Util/GenerateHtmlCombinators.hs:154
    , height                                                                    -- ./Util/GenerateHtmlCombinators.hs:154
    , hidden                                                                    -- ./Util/GenerateHtmlCombinators.hs:154
    , high                                                                      -- ./Util/GenerateHtmlCombinators.hs:154
    , href                                                                      -- ./Util/GenerateHtmlCombinators.hs:154
    , hreflang                                                                  -- ./Util/GenerateHtmlCombinators.hs:154
    , http_equiv                                                                -- ./Util/GenerateHtmlCombinators.hs:154
    , icon                                                                      -- ./Util/GenerateHtmlCombinators.hs:154
    , id                                                                        -- ./Util/GenerateHtmlCombinators.hs:154
    , ismap                                                                     -- ./Util/GenerateHtmlCombinators.hs:154
    , item                                                                      -- ./Util/GenerateHtmlCombinators.hs:154
    , itemprop                                                                  -- ./Util/GenerateHtmlCombinators.hs:154
    , keytype                                                                   -- ./Util/GenerateHtmlCombinators.hs:154
    , label                                                                     -- ./Util/GenerateHtmlCombinators.hs:154
    , lang                                                                      -- ./Util/GenerateHtmlCombinators.hs:154
    , list                                                                      -- ./Util/GenerateHtmlCombinators.hs:154
    , loop                                                                      -- ./Util/GenerateHtmlCombinators.hs:154
    , low                                                                       -- ./Util/GenerateHtmlCombinators.hs:154
    , manifest                                                                  -- ./Util/GenerateHtmlCombinators.hs:154
    , max                                                                       -- ./Util/GenerateHtmlCombinators.hs:154
    , maxlength                                                                 -- ./Util/GenerateHtmlCombinators.hs:154
    , media                                                                     -- ./Util/GenerateHtmlCombinators.hs:154
    , method                                                                    -- ./Util/GenerateHtmlCombinators.hs:154
    , min                                                                       -- ./Util/GenerateHtmlCombinators.hs:154
    , multiple                                                                  -- ./Util/GenerateHtmlCombinators.hs:154
    , name                                                                      -- ./Util/GenerateHtmlCombinators.hs:154
    , novalidate                                                                -- ./Util/GenerateHtmlCombinators.hs:154
    , onbeforeonload                                                            -- ./Util/GenerateHtmlCombinators.hs:154
    , onbeforeprint                                                             -- ./Util/GenerateHtmlCombinators.hs:154
    , oncanplay                                                                 -- ./Util/GenerateHtmlCombinators.hs:154
    , oncanplaythrough                                                          -- ./Util/GenerateHtmlCombinators.hs:154
    , onchange                                                                  -- ./Util/GenerateHtmlCombinators.hs:154
    , onclick                                                                   -- ./Util/GenerateHtmlCombinators.hs:154
    , oncontextmenu                                                             -- ./Util/GenerateHtmlCombinators.hs:154
    , ondblclick                                                                -- ./Util/GenerateHtmlCombinators.hs:154
    , ondrag                                                                    -- ./Util/GenerateHtmlCombinators.hs:154
    , ondragend                                                                 -- ./Util/GenerateHtmlCombinators.hs:154
    , ondragenter                                                               -- ./Util/GenerateHtmlCombinators.hs:154
    , ondragleave                                                               -- ./Util/GenerateHtmlCombinators.hs:154
    , ondragover                                                                -- ./Util/GenerateHtmlCombinators.hs:154
    , ondragstart                                                               -- ./Util/GenerateHtmlCombinators.hs:154
    , ondrop                                                                    -- ./Util/GenerateHtmlCombinators.hs:154
    , ondurationchange                                                          -- ./Util/GenerateHtmlCombinators.hs:154
    , onemptied                                                                 -- ./Util/GenerateHtmlCombinators.hs:154
    , onended                                                                   -- ./Util/GenerateHtmlCombinators.hs:154
    , onerror                                                                   -- ./Util/GenerateHtmlCombinators.hs:154
    , onfocus                                                                   -- ./Util/GenerateHtmlCombinators.hs:154
    , onformchange                                                              -- ./Util/GenerateHtmlCombinators.hs:154
    , onforminput                                                               -- ./Util/GenerateHtmlCombinators.hs:154
    , onhaschange                                                               -- ./Util/GenerateHtmlCombinators.hs:154
    , oninput                                                                   -- ./Util/GenerateHtmlCombinators.hs:154
    , oninvalid                                                                 -- ./Util/GenerateHtmlCombinators.hs:154
    , onkeydown                                                                 -- ./Util/GenerateHtmlCombinators.hs:154
    , onkeyup                                                                   -- ./Util/GenerateHtmlCombinators.hs:154
    , onload                                                                    -- ./Util/GenerateHtmlCombinators.hs:154
    , onloadeddata                                                              -- ./Util/GenerateHtmlCombinators.hs:154
    , onloadedmetadata                                                          -- ./Util/GenerateHtmlCombinators.hs:154
    , onloadstart                                                               -- ./Util/GenerateHtmlCombinators.hs:154
    , onmessage                                                                 -- ./Util/GenerateHtmlCombinators.hs:154
    , onmousedown                                                               -- ./Util/GenerateHtmlCombinators.hs:154
    , onmousemove                                                               -- ./Util/GenerateHtmlCombinators.hs:154
    , onmouseout                                                                -- ./Util/GenerateHtmlCombinators.hs:154
    , onmouseover                                                               -- ./Util/GenerateHtmlCombinators.hs:154
    , onmouseup                                                                 -- ./Util/GenerateHtmlCombinators.hs:154
    , onmousewheel                                                              -- ./Util/GenerateHtmlCombinators.hs:154
    , ononline                                                                  -- ./Util/GenerateHtmlCombinators.hs:154
    , onpagehide                                                                -- ./Util/GenerateHtmlCombinators.hs:154
    , onpageshow                                                                -- ./Util/GenerateHtmlCombinators.hs:154
    , onpause                                                                   -- ./Util/GenerateHtmlCombinators.hs:154
    , onplay                                                                    -- ./Util/GenerateHtmlCombinators.hs:154
    , onplaying                                                                 -- ./Util/GenerateHtmlCombinators.hs:154
    , onprogress                                                                -- ./Util/GenerateHtmlCombinators.hs:154
    , onpropstate                                                               -- ./Util/GenerateHtmlCombinators.hs:154
    , onratechange                                                              -- ./Util/GenerateHtmlCombinators.hs:154
    , onreadystatechange                                                        -- ./Util/GenerateHtmlCombinators.hs:154
    , onredo                                                                    -- ./Util/GenerateHtmlCombinators.hs:154
    , onresize                                                                  -- ./Util/GenerateHtmlCombinators.hs:154
    , onscroll                                                                  -- ./Util/GenerateHtmlCombinators.hs:154
    , onseeked                                                                  -- ./Util/GenerateHtmlCombinators.hs:154
    , onseeking                                                                 -- ./Util/GenerateHtmlCombinators.hs:154
    , onselect                                                                  -- ./Util/GenerateHtmlCombinators.hs:154
    , onstalled                                                                 -- ./Util/GenerateHtmlCombinators.hs:154
    , onstorage                                                                 -- ./Util/GenerateHtmlCombinators.hs:154
    , onsubmit                                                                  -- ./Util/GenerateHtmlCombinators.hs:154
    , onsuspend                                                                 -- ./Util/GenerateHtmlCombinators.hs:154
    , ontimeupdate                                                              -- ./Util/GenerateHtmlCombinators.hs:154
    , onundo                                                                    -- ./Util/GenerateHtmlCombinators.hs:154
    , onunload                                                                  -- ./Util/GenerateHtmlCombinators.hs:154
    , onvolumechange                                                            -- ./Util/GenerateHtmlCombinators.hs:154
    , onwaiting                                                                 -- ./Util/GenerateHtmlCombinators.hs:154
    , open                                                                      -- ./Util/GenerateHtmlCombinators.hs:154
    , optimum                                                                   -- ./Util/GenerateHtmlCombinators.hs:154
    , pattern                                                                   -- ./Util/GenerateHtmlCombinators.hs:154
    , ping                                                                      -- ./Util/GenerateHtmlCombinators.hs:154
    , placeholder                                                               -- ./Util/GenerateHtmlCombinators.hs:154
    , preload                                                                   -- ./Util/GenerateHtmlCombinators.hs:154
    , pubdate                                                                   -- ./Util/GenerateHtmlCombinators.hs:154
    , radiogroup                                                                -- ./Util/GenerateHtmlCombinators.hs:154
    , readonly                                                                  -- ./Util/GenerateHtmlCombinators.hs:154
    , rel                                                                       -- ./Util/GenerateHtmlCombinators.hs:154
    , required                                                                  -- ./Util/GenerateHtmlCombinators.hs:154
    , reversed                                                                  -- ./Util/GenerateHtmlCombinators.hs:154
    , rows                                                                      -- ./Util/GenerateHtmlCombinators.hs:154
    , rowspan                                                                   -- ./Util/GenerateHtmlCombinators.hs:154
    , sandbox                                                                   -- ./Util/GenerateHtmlCombinators.hs:154
    , scope                                                                     -- ./Util/GenerateHtmlCombinators.hs:154
    , scoped                                                                    -- ./Util/GenerateHtmlCombinators.hs:154
    , seamless                                                                  -- ./Util/GenerateHtmlCombinators.hs:154
    , selected                                                                  -- ./Util/GenerateHtmlCombinators.hs:154
    , shape                                                                     -- ./Util/GenerateHtmlCombinators.hs:154
    , size                                                                      -- ./Util/GenerateHtmlCombinators.hs:154
    , sizes                                                                     -- ./Util/GenerateHtmlCombinators.hs:154
    , span                                                                      -- ./Util/GenerateHtmlCombinators.hs:154
    , spellcheck                                                                -- ./Util/GenerateHtmlCombinators.hs:154
    , src                                                                       -- ./Util/GenerateHtmlCombinators.hs:154
    , srcdoc                                                                    -- ./Util/GenerateHtmlCombinators.hs:154
    , start                                                                     -- ./Util/GenerateHtmlCombinators.hs:154
    , step                                                                      -- ./Util/GenerateHtmlCombinators.hs:154
    , style                                                                     -- ./Util/GenerateHtmlCombinators.hs:154
    , subject                                                                   -- ./Util/GenerateHtmlCombinators.hs:154
    , summary                                                                   -- ./Util/GenerateHtmlCombinators.hs:154
    , tabindex                                                                  -- ./Util/GenerateHtmlCombinators.hs:154
    , target                                                                    -- ./Util/GenerateHtmlCombinators.hs:154
    , title                                                                     -- ./Util/GenerateHtmlCombinators.hs:154
    , type_                                                                     -- ./Util/GenerateHtmlCombinators.hs:154
    , usemap                                                                    -- ./Util/GenerateHtmlCombinators.hs:154
    , value                                                                     -- ./Util/GenerateHtmlCombinators.hs:154
    , width                                                                     -- ./Util/GenerateHtmlCombinators.hs:154
    , wrap                                                                      -- ./Util/GenerateHtmlCombinators.hs:154
    , xmlns                                                                     -- ./Util/GenerateHtmlCombinators.hs:154
    ) where                                                                     -- ./Util/GenerateHtmlCombinators.hs:155

import Prelude ()                                                               -- ./Util/GenerateHtmlCombinators.hs:105
                                                                                -- ./Util/GenerateHtmlCombinators.hs:106
import Text.Blaze.Internal (Attribute, AttributeValue, attribute)               -- ./Util/GenerateHtmlCombinators.hs:107
                                                                                -- ./Util/GenerateHtmlCombinators.hs:108
-- | Combinator for the @accept@ attribute.
--
-- Example:
--
-- > div ! accept "bar" $ "Hello."
--
-- Result:
--
-- > <div accept="bar">Hello.</div>
--
accept :: AttributeValue  -- ^ Attribute value.                                 -- ./Util/GenerateHtmlCombinators.hs:260
       -> Attribute       -- ^ Resulting attribute.                             -- ./Util/GenerateHtmlCombinators.hs:261
accept = attribute " accept=\""                                                 -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE accept #-}                                                           -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @accept-charset@ attribute.
--
-- Example:
--
-- > div ! accept_charset "bar" $ "Hello."
--
-- Result:
--
-- > <div accept-charset="bar">Hello.</div>
--
accept_charset :: AttributeValue  -- ^ Attribute value.                         -- ./Util/GenerateHtmlCombinators.hs:260
               -> Attribute       -- ^ Resulting attribute.                     -- ./Util/GenerateHtmlCombinators.hs:261
accept_charset = attribute " accept-charset=\""                                 -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE accept_charset #-}                                                   -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @accesskey@ attribute.
--
-- Example:
--
-- > div ! accesskey "bar" $ "Hello."
--
-- Result:
--
-- > <div accesskey="bar">Hello.</div>
--
accesskey :: AttributeValue  -- ^ Attribute value.                              -- ./Util/GenerateHtmlCombinators.hs:260
          -> Attribute       -- ^ Resulting attribute.                          -- ./Util/GenerateHtmlCombinators.hs:261
accesskey = attribute " accesskey=\""                                           -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE accesskey #-}                                                        -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @action@ attribute.
--
-- Example:
--
-- > div ! action "bar" $ "Hello."
--
-- Result:
--
-- > <div action="bar">Hello.</div>
--
action :: AttributeValue  -- ^ Attribute value.                                 -- ./Util/GenerateHtmlCombinators.hs:260
       -> Attribute       -- ^ Resulting attribute.                             -- ./Util/GenerateHtmlCombinators.hs:261
action = attribute " action=\""                                                 -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE action #-}                                                           -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @alt@ attribute.
--
-- Example:
--
-- > div ! alt "bar" $ "Hello."
--
-- Result:
--
-- > <div alt="bar">Hello.</div>
--
alt :: AttributeValue  -- ^ Attribute value.                                    -- ./Util/GenerateHtmlCombinators.hs:260
    -> Attribute       -- ^ Resulting attribute.                                -- ./Util/GenerateHtmlCombinators.hs:261
alt = attribute " alt=\""                                                       -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE alt #-}                                                              -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @async@ attribute.
--
-- Example:
--
-- > div ! async "bar" $ "Hello."
--
-- Result:
--
-- > <div async="bar">Hello.</div>
--
async :: AttributeValue  -- ^ Attribute value.                                  -- ./Util/GenerateHtmlCombinators.hs:260
      -> Attribute       -- ^ Resulting attribute.                              -- ./Util/GenerateHtmlCombinators.hs:261
async = attribute " async=\""                                                   -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE async #-}                                                            -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @autocomplete@ attribute.
--
-- Example:
--
-- > div ! autocomplete "bar" $ "Hello."
--
-- Result:
--
-- > <div autocomplete="bar">Hello.</div>
--
autocomplete :: AttributeValue  -- ^ Attribute value.                           -- ./Util/GenerateHtmlCombinators.hs:260
             -> Attribute       -- ^ Resulting attribute.                       -- ./Util/GenerateHtmlCombinators.hs:261
autocomplete = attribute " autocomplete=\""                                     -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE autocomplete #-}                                                     -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @autofocus@ attribute.
--
-- Example:
--
-- > div ! autofocus "bar" $ "Hello."
--
-- Result:
--
-- > <div autofocus="bar">Hello.</div>
--
autofocus :: AttributeValue  -- ^ Attribute value.                              -- ./Util/GenerateHtmlCombinators.hs:260
          -> Attribute       -- ^ Resulting attribute.                          -- ./Util/GenerateHtmlCombinators.hs:261
autofocus = attribute " autofocus=\""                                           -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE autofocus #-}                                                        -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @autoplay@ attribute.
--
-- Example:
--
-- > div ! autoplay "bar" $ "Hello."
--
-- Result:
--
-- > <div autoplay="bar">Hello.</div>
--
autoplay :: AttributeValue  -- ^ Attribute value.                               -- ./Util/GenerateHtmlCombinators.hs:260
         -> Attribute       -- ^ Resulting attribute.                           -- ./Util/GenerateHtmlCombinators.hs:261
autoplay = attribute " autoplay=\""                                             -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE autoplay #-}                                                         -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @challenge@ attribute.
--
-- Example:
--
-- > div ! challenge "bar" $ "Hello."
--
-- Result:
--
-- > <div challenge="bar">Hello.</div>
--
challenge :: AttributeValue  -- ^ Attribute value.                              -- ./Util/GenerateHtmlCombinators.hs:260
          -> Attribute       -- ^ Resulting attribute.                          -- ./Util/GenerateHtmlCombinators.hs:261
challenge = attribute " challenge=\""                                           -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE challenge #-}                                                        -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @charset@ attribute.
--
-- Example:
--
-- > div ! charset "bar" $ "Hello."
--
-- Result:
--
-- > <div charset="bar">Hello.</div>
--
charset :: AttributeValue  -- ^ Attribute value.                                -- ./Util/GenerateHtmlCombinators.hs:260
        -> Attribute       -- ^ Resulting attribute.                            -- ./Util/GenerateHtmlCombinators.hs:261
charset = attribute " charset=\""                                               -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE charset #-}                                                          -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @checked@ attribute.
--
-- Example:
--
-- > div ! checked "bar" $ "Hello."
--
-- Result:
--
-- > <div checked="bar">Hello.</div>
--
checked :: AttributeValue  -- ^ Attribute value.                                -- ./Util/GenerateHtmlCombinators.hs:260
        -> Attribute       -- ^ Resulting attribute.                            -- ./Util/GenerateHtmlCombinators.hs:261
checked = attribute " checked=\""                                               -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE checked #-}                                                          -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @cite@ attribute.
--
-- Example:
--
-- > div ! cite "bar" $ "Hello."
--
-- Result:
--
-- > <div cite="bar">Hello.</div>
--
cite :: AttributeValue  -- ^ Attribute value.                                   -- ./Util/GenerateHtmlCombinators.hs:260
     -> Attribute       -- ^ Resulting attribute.                               -- ./Util/GenerateHtmlCombinators.hs:261
cite = attribute " cite=\""                                                     -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE cite #-}                                                             -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @class@ attribute.
--
-- Example:
--
-- > div ! class_ "bar" $ "Hello."
--
-- Result:
--
-- > <div class="bar">Hello.</div>
--
class_ :: AttributeValue  -- ^ Attribute value.                                 -- ./Util/GenerateHtmlCombinators.hs:260
       -> Attribute       -- ^ Resulting attribute.                             -- ./Util/GenerateHtmlCombinators.hs:261
class_ = attribute " class=\""                                                  -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE class_ #-}                                                           -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @cols@ attribute.
--
-- Example:
--
-- > div ! cols "bar" $ "Hello."
--
-- Result:
--
-- > <div cols="bar">Hello.</div>
--
cols :: AttributeValue  -- ^ Attribute value.                                   -- ./Util/GenerateHtmlCombinators.hs:260
     -> Attribute       -- ^ Resulting attribute.                               -- ./Util/GenerateHtmlCombinators.hs:261
cols = attribute " cols=\""                                                     -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE cols #-}                                                             -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @colspan@ attribute.
--
-- Example:
--
-- > div ! colspan "bar" $ "Hello."
--
-- Result:
--
-- > <div colspan="bar">Hello.</div>
--
colspan :: AttributeValue  -- ^ Attribute value.                                -- ./Util/GenerateHtmlCombinators.hs:260
        -> Attribute       -- ^ Resulting attribute.                            -- ./Util/GenerateHtmlCombinators.hs:261
colspan = attribute " colspan=\""                                               -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE colspan #-}                                                          -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @content@ attribute.
--
-- Example:
--
-- > div ! content "bar" $ "Hello."
--
-- Result:
--
-- > <div content="bar">Hello.</div>
--
content :: AttributeValue  -- ^ Attribute value.                                -- ./Util/GenerateHtmlCombinators.hs:260
        -> Attribute       -- ^ Resulting attribute.                            -- ./Util/GenerateHtmlCombinators.hs:261
content = attribute " content=\""                                               -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE content #-}                                                          -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @contenteditable@ attribute.
--
-- Example:
--
-- > div ! contenteditable "bar" $ "Hello."
--
-- Result:
--
-- > <div contenteditable="bar">Hello.</div>
--
contenteditable :: AttributeValue  -- ^ Attribute value.                        -- ./Util/GenerateHtmlCombinators.hs:260
                -> Attribute       -- ^ Resulting attribute.                    -- ./Util/GenerateHtmlCombinators.hs:261
contenteditable = attribute " contenteditable=\""                               -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE contenteditable #-}                                                  -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @contextmenu@ attribute.
--
-- Example:
--
-- > div ! contextmenu "bar" $ "Hello."
--
-- Result:
--
-- > <div contextmenu="bar">Hello.</div>
--
contextmenu :: AttributeValue  -- ^ Attribute value.                            -- ./Util/GenerateHtmlCombinators.hs:260
            -> Attribute       -- ^ Resulting attribute.                        -- ./Util/GenerateHtmlCombinators.hs:261
contextmenu = attribute " contextmenu=\""                                       -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE contextmenu #-}                                                      -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @controls@ attribute.
--
-- Example:
--
-- > div ! controls "bar" $ "Hello."
--
-- Result:
--
-- > <div controls="bar">Hello.</div>
--
controls :: AttributeValue  -- ^ Attribute value.                               -- ./Util/GenerateHtmlCombinators.hs:260
         -> Attribute       -- ^ Resulting attribute.                           -- ./Util/GenerateHtmlCombinators.hs:261
controls = attribute " controls=\""                                             -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE controls #-}                                                         -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @coords@ attribute.
--
-- Example:
--
-- > div ! coords "bar" $ "Hello."
--
-- Result:
--
-- > <div coords="bar">Hello.</div>
--
coords :: AttributeValue  -- ^ Attribute value.                                 -- ./Util/GenerateHtmlCombinators.hs:260
       -> Attribute       -- ^ Resulting attribute.                             -- ./Util/GenerateHtmlCombinators.hs:261
coords = attribute " coords=\""                                                 -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE coords #-}                                                           -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @data@ attribute.
--
-- Example:
--
-- > div ! data_ "bar" $ "Hello."
--
-- Result:
--
-- > <div data="bar">Hello.</div>
--
data_ :: AttributeValue  -- ^ Attribute value.                                  -- ./Util/GenerateHtmlCombinators.hs:260
      -> Attribute       -- ^ Resulting attribute.                              -- ./Util/GenerateHtmlCombinators.hs:261
data_ = attribute " data=\""                                                    -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE data_ #-}                                                            -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @datetime@ attribute.
--
-- Example:
--
-- > div ! datetime "bar" $ "Hello."
--
-- Result:
--
-- > <div datetime="bar">Hello.</div>
--
datetime :: AttributeValue  -- ^ Attribute value.                               -- ./Util/GenerateHtmlCombinators.hs:260
         -> Attribute       -- ^ Resulting attribute.                           -- ./Util/GenerateHtmlCombinators.hs:261
datetime = attribute " datetime=\""                                             -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE datetime #-}                                                         -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @defer@ attribute.
--
-- Example:
--
-- > div ! defer "bar" $ "Hello."
--
-- Result:
--
-- > <div defer="bar">Hello.</div>
--
defer :: AttributeValue  -- ^ Attribute value.                                  -- ./Util/GenerateHtmlCombinators.hs:260
      -> Attribute       -- ^ Resulting attribute.                              -- ./Util/GenerateHtmlCombinators.hs:261
defer = attribute " defer=\""                                                   -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE defer #-}                                                            -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @dir@ attribute.
--
-- Example:
--
-- > div ! dir "bar" $ "Hello."
--
-- Result:
--
-- > <div dir="bar">Hello.</div>
--
dir :: AttributeValue  -- ^ Attribute value.                                    -- ./Util/GenerateHtmlCombinators.hs:260
    -> Attribute       -- ^ Resulting attribute.                                -- ./Util/GenerateHtmlCombinators.hs:261
dir = attribute " dir=\""                                                       -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE dir #-}                                                              -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @disabled@ attribute.
--
-- Example:
--
-- > div ! disabled "bar" $ "Hello."
--
-- Result:
--
-- > <div disabled="bar">Hello.</div>
--
disabled :: AttributeValue  -- ^ Attribute value.                               -- ./Util/GenerateHtmlCombinators.hs:260
         -> Attribute       -- ^ Resulting attribute.                           -- ./Util/GenerateHtmlCombinators.hs:261
disabled = attribute " disabled=\""                                             -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE disabled #-}                                                         -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @draggable@ attribute.
--
-- Example:
--
-- > div ! draggable "bar" $ "Hello."
--
-- Result:
--
-- > <div draggable="bar">Hello.</div>
--
draggable :: AttributeValue  -- ^ Attribute value.                              -- ./Util/GenerateHtmlCombinators.hs:260
          -> Attribute       -- ^ Resulting attribute.                          -- ./Util/GenerateHtmlCombinators.hs:261
draggable = attribute " draggable=\""                                           -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE draggable #-}                                                        -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @enctype@ attribute.
--
-- Example:
--
-- > div ! enctype "bar" $ "Hello."
--
-- Result:
--
-- > <div enctype="bar">Hello.</div>
--
enctype :: AttributeValue  -- ^ Attribute value.                                -- ./Util/GenerateHtmlCombinators.hs:260
        -> Attribute       -- ^ Resulting attribute.                            -- ./Util/GenerateHtmlCombinators.hs:261
enctype = attribute " enctype=\""                                               -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE enctype #-}                                                          -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @for@ attribute.
--
-- Example:
--
-- > div ! for "bar" $ "Hello."
--
-- Result:
--
-- > <div for="bar">Hello.</div>
--
for :: AttributeValue  -- ^ Attribute value.                                    -- ./Util/GenerateHtmlCombinators.hs:260
    -> Attribute       -- ^ Resulting attribute.                                -- ./Util/GenerateHtmlCombinators.hs:261
for = attribute " for=\""                                                       -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE for #-}                                                              -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @form@ attribute.
--
-- Example:
--
-- > div ! form "bar" $ "Hello."
--
-- Result:
--
-- > <div form="bar">Hello.</div>
--
form :: AttributeValue  -- ^ Attribute value.                                   -- ./Util/GenerateHtmlCombinators.hs:260
     -> Attribute       -- ^ Resulting attribute.                               -- ./Util/GenerateHtmlCombinators.hs:261
form = attribute " form=\""                                                     -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE form #-}                                                             -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @formaction@ attribute.
--
-- Example:
--
-- > div ! formaction "bar" $ "Hello."
--
-- Result:
--
-- > <div formaction="bar">Hello.</div>
--
formaction :: AttributeValue  -- ^ Attribute value.                             -- ./Util/GenerateHtmlCombinators.hs:260
           -> Attribute       -- ^ Resulting attribute.                         -- ./Util/GenerateHtmlCombinators.hs:261
formaction = attribute " formaction=\""                                         -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE formaction #-}                                                       -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @formenctype@ attribute.
--
-- Example:
--
-- > div ! formenctype "bar" $ "Hello."
--
-- Result:
--
-- > <div formenctype="bar">Hello.</div>
--
formenctype :: AttributeValue  -- ^ Attribute value.                            -- ./Util/GenerateHtmlCombinators.hs:260
            -> Attribute       -- ^ Resulting attribute.                        -- ./Util/GenerateHtmlCombinators.hs:261
formenctype = attribute " formenctype=\""                                       -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE formenctype #-}                                                      -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @formmethod@ attribute.
--
-- Example:
--
-- > div ! formmethod "bar" $ "Hello."
--
-- Result:
--
-- > <div formmethod="bar">Hello.</div>
--
formmethod :: AttributeValue  -- ^ Attribute value.                             -- ./Util/GenerateHtmlCombinators.hs:260
           -> Attribute       -- ^ Resulting attribute.                         -- ./Util/GenerateHtmlCombinators.hs:261
formmethod = attribute " formmethod=\""                                         -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE formmethod #-}                                                       -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @formnovalidate@ attribute.
--
-- Example:
--
-- > div ! formnovalidate "bar" $ "Hello."
--
-- Result:
--
-- > <div formnovalidate="bar">Hello.</div>
--
formnovalidate :: AttributeValue  -- ^ Attribute value.                         -- ./Util/GenerateHtmlCombinators.hs:260
               -> Attribute       -- ^ Resulting attribute.                     -- ./Util/GenerateHtmlCombinators.hs:261
formnovalidate = attribute " formnovalidate=\""                                 -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE formnovalidate #-}                                                   -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @formtarget@ attribute.
--
-- Example:
--
-- > div ! formtarget "bar" $ "Hello."
--
-- Result:
--
-- > <div formtarget="bar">Hello.</div>
--
formtarget :: AttributeValue  -- ^ Attribute value.                             -- ./Util/GenerateHtmlCombinators.hs:260
           -> Attribute       -- ^ Resulting attribute.                         -- ./Util/GenerateHtmlCombinators.hs:261
formtarget = attribute " formtarget=\""                                         -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE formtarget #-}                                                       -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @headers@ attribute.
--
-- Example:
--
-- > div ! headers "bar" $ "Hello."
--
-- Result:
--
-- > <div headers="bar">Hello.</div>
--
headers :: AttributeValue  -- ^ Attribute value.                                -- ./Util/GenerateHtmlCombinators.hs:260
        -> Attribute       -- ^ Resulting attribute.                            -- ./Util/GenerateHtmlCombinators.hs:261
headers = attribute " headers=\""                                               -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE headers #-}                                                          -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @height@ attribute.
--
-- Example:
--
-- > div ! height "bar" $ "Hello."
--
-- Result:
--
-- > <div height="bar">Hello.</div>
--
height :: AttributeValue  -- ^ Attribute value.                                 -- ./Util/GenerateHtmlCombinators.hs:260
       -> Attribute       -- ^ Resulting attribute.                             -- ./Util/GenerateHtmlCombinators.hs:261
height = attribute " height=\""                                                 -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE height #-}                                                           -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @hidden@ attribute.
--
-- Example:
--
-- > div ! hidden "bar" $ "Hello."
--
-- Result:
--
-- > <div hidden="bar">Hello.</div>
--
hidden :: AttributeValue  -- ^ Attribute value.                                 -- ./Util/GenerateHtmlCombinators.hs:260
       -> Attribute       -- ^ Resulting attribute.                             -- ./Util/GenerateHtmlCombinators.hs:261
hidden = attribute " hidden=\""                                                 -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE hidden #-}                                                           -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @high@ attribute.
--
-- Example:
--
-- > div ! high "bar" $ "Hello."
--
-- Result:
--
-- > <div high="bar">Hello.</div>
--
high :: AttributeValue  -- ^ Attribute value.                                   -- ./Util/GenerateHtmlCombinators.hs:260
     -> Attribute       -- ^ Resulting attribute.                               -- ./Util/GenerateHtmlCombinators.hs:261
high = attribute " high=\""                                                     -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE high #-}                                                             -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @href@ attribute.
--
-- Example:
--
-- > div ! href "bar" $ "Hello."
--
-- Result:
--
-- > <div href="bar">Hello.</div>
--
href :: AttributeValue  -- ^ Attribute value.                                   -- ./Util/GenerateHtmlCombinators.hs:260
     -> Attribute       -- ^ Resulting attribute.                               -- ./Util/GenerateHtmlCombinators.hs:261
href = attribute " href=\""                                                     -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE href #-}                                                             -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @hreflang@ attribute.
--
-- Example:
--
-- > div ! hreflang "bar" $ "Hello."
--
-- Result:
--
-- > <div hreflang="bar">Hello.</div>
--
hreflang :: AttributeValue  -- ^ Attribute value.                               -- ./Util/GenerateHtmlCombinators.hs:260
         -> Attribute       -- ^ Resulting attribute.                           -- ./Util/GenerateHtmlCombinators.hs:261
hreflang = attribute " hreflang=\""                                             -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE hreflang #-}                                                         -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @http-equiv@ attribute.
--
-- Example:
--
-- > div ! http_equiv "bar" $ "Hello."
--
-- Result:
--
-- > <div http-equiv="bar">Hello.</div>
--
http_equiv :: AttributeValue  -- ^ Attribute value.                             -- ./Util/GenerateHtmlCombinators.hs:260
           -> Attribute       -- ^ Resulting attribute.                         -- ./Util/GenerateHtmlCombinators.hs:261
http_equiv = attribute " http-equiv=\""                                         -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE http_equiv #-}                                                       -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @icon@ attribute.
--
-- Example:
--
-- > div ! icon "bar" $ "Hello."
--
-- Result:
--
-- > <div icon="bar">Hello.</div>
--
icon :: AttributeValue  -- ^ Attribute value.                                   -- ./Util/GenerateHtmlCombinators.hs:260
     -> Attribute       -- ^ Resulting attribute.                               -- ./Util/GenerateHtmlCombinators.hs:261
icon = attribute " icon=\""                                                     -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE icon #-}                                                             -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @id@ attribute.
--
-- Example:
--
-- > div ! id "bar" $ "Hello."
--
-- Result:
--
-- > <div id="bar">Hello.</div>
--
id :: AttributeValue  -- ^ Attribute value.                                     -- ./Util/GenerateHtmlCombinators.hs:260
   -> Attribute       -- ^ Resulting attribute.                                 -- ./Util/GenerateHtmlCombinators.hs:261
id = attribute " id=\""                                                         -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE id #-}                                                               -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @ismap@ attribute.
--
-- Example:
--
-- > div ! ismap "bar" $ "Hello."
--
-- Result:
--
-- > <div ismap="bar">Hello.</div>
--
ismap :: AttributeValue  -- ^ Attribute value.                                  -- ./Util/GenerateHtmlCombinators.hs:260
      -> Attribute       -- ^ Resulting attribute.                              -- ./Util/GenerateHtmlCombinators.hs:261
ismap = attribute " ismap=\""                                                   -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE ismap #-}                                                            -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @item@ attribute.
--
-- Example:
--
-- > div ! item "bar" $ "Hello."
--
-- Result:
--
-- > <div item="bar">Hello.</div>
--
item :: AttributeValue  -- ^ Attribute value.                                   -- ./Util/GenerateHtmlCombinators.hs:260
     -> Attribute       -- ^ Resulting attribute.                               -- ./Util/GenerateHtmlCombinators.hs:261
item = attribute " item=\""                                                     -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE item #-}                                                             -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @itemprop@ attribute.
--
-- Example:
--
-- > div ! itemprop "bar" $ "Hello."
--
-- Result:
--
-- > <div itemprop="bar">Hello.</div>
--
itemprop :: AttributeValue  -- ^ Attribute value.                               -- ./Util/GenerateHtmlCombinators.hs:260
         -> Attribute       -- ^ Resulting attribute.                           -- ./Util/GenerateHtmlCombinators.hs:261
itemprop = attribute " itemprop=\""                                             -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE itemprop #-}                                                         -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @keytype@ attribute.
--
-- Example:
--
-- > div ! keytype "bar" $ "Hello."
--
-- Result:
--
-- > <div keytype="bar">Hello.</div>
--
keytype :: AttributeValue  -- ^ Attribute value.                                -- ./Util/GenerateHtmlCombinators.hs:260
        -> Attribute       -- ^ Resulting attribute.                            -- ./Util/GenerateHtmlCombinators.hs:261
keytype = attribute " keytype=\""                                               -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE keytype #-}                                                          -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @label@ attribute.
--
-- Example:
--
-- > div ! label "bar" $ "Hello."
--
-- Result:
--
-- > <div label="bar">Hello.</div>
--
label :: AttributeValue  -- ^ Attribute value.                                  -- ./Util/GenerateHtmlCombinators.hs:260
      -> Attribute       -- ^ Resulting attribute.                              -- ./Util/GenerateHtmlCombinators.hs:261
label = attribute " label=\""                                                   -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE label #-}                                                            -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @lang@ attribute.
--
-- Example:
--
-- > div ! lang "bar" $ "Hello."
--
-- Result:
--
-- > <div lang="bar">Hello.</div>
--
lang :: AttributeValue  -- ^ Attribute value.                                   -- ./Util/GenerateHtmlCombinators.hs:260
     -> Attribute       -- ^ Resulting attribute.                               -- ./Util/GenerateHtmlCombinators.hs:261
lang = attribute " lang=\""                                                     -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE lang #-}                                                             -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @list@ attribute.
--
-- Example:
--
-- > div ! list "bar" $ "Hello."
--
-- Result:
--
-- > <div list="bar">Hello.</div>
--
list :: AttributeValue  -- ^ Attribute value.                                   -- ./Util/GenerateHtmlCombinators.hs:260
     -> Attribute       -- ^ Resulting attribute.                               -- ./Util/GenerateHtmlCombinators.hs:261
list = attribute " list=\""                                                     -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE list #-}                                                             -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @loop@ attribute.
--
-- Example:
--
-- > div ! loop "bar" $ "Hello."
--
-- Result:
--
-- > <div loop="bar">Hello.</div>
--
loop :: AttributeValue  -- ^ Attribute value.                                   -- ./Util/GenerateHtmlCombinators.hs:260
     -> Attribute       -- ^ Resulting attribute.                               -- ./Util/GenerateHtmlCombinators.hs:261
loop = attribute " loop=\""                                                     -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE loop #-}                                                             -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @low@ attribute.
--
-- Example:
--
-- > div ! low "bar" $ "Hello."
--
-- Result:
--
-- > <div low="bar">Hello.</div>
--
low :: AttributeValue  -- ^ Attribute value.                                    -- ./Util/GenerateHtmlCombinators.hs:260
    -> Attribute       -- ^ Resulting attribute.                                -- ./Util/GenerateHtmlCombinators.hs:261
low = attribute " low=\""                                                       -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE low #-}                                                              -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @manifest@ attribute.
--
-- Example:
--
-- > div ! manifest "bar" $ "Hello."
--
-- Result:
--
-- > <div manifest="bar">Hello.</div>
--
manifest :: AttributeValue  -- ^ Attribute value.                               -- ./Util/GenerateHtmlCombinators.hs:260
         -> Attribute       -- ^ Resulting attribute.                           -- ./Util/GenerateHtmlCombinators.hs:261
manifest = attribute " manifest=\""                                             -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE manifest #-}                                                         -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @max@ attribute.
--
-- Example:
--
-- > div ! max "bar" $ "Hello."
--
-- Result:
--
-- > <div max="bar">Hello.</div>
--
max :: AttributeValue  -- ^ Attribute value.                                    -- ./Util/GenerateHtmlCombinators.hs:260
    -> Attribute       -- ^ Resulting attribute.                                -- ./Util/GenerateHtmlCombinators.hs:261
max = attribute " max=\""                                                       -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE max #-}                                                              -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @maxlength@ attribute.
--
-- Example:
--
-- > div ! maxlength "bar" $ "Hello."
--
-- Result:
--
-- > <div maxlength="bar">Hello.</div>
--
maxlength :: AttributeValue  -- ^ Attribute value.                              -- ./Util/GenerateHtmlCombinators.hs:260
          -> Attribute       -- ^ Resulting attribute.                          -- ./Util/GenerateHtmlCombinators.hs:261
maxlength = attribute " maxlength=\""                                           -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE maxlength #-}                                                        -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @media@ attribute.
--
-- Example:
--
-- > div ! media "bar" $ "Hello."
--
-- Result:
--
-- > <div media="bar">Hello.</div>
--
media :: AttributeValue  -- ^ Attribute value.                                  -- ./Util/GenerateHtmlCombinators.hs:260
      -> Attribute       -- ^ Resulting attribute.                              -- ./Util/GenerateHtmlCombinators.hs:261
media = attribute " media=\""                                                   -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE media #-}                                                            -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @method@ attribute.
--
-- Example:
--
-- > div ! method "bar" $ "Hello."
--
-- Result:
--
-- > <div method="bar">Hello.</div>
--
method :: AttributeValue  -- ^ Attribute value.                                 -- ./Util/GenerateHtmlCombinators.hs:260
       -> Attribute       -- ^ Resulting attribute.                             -- ./Util/GenerateHtmlCombinators.hs:261
method = attribute " method=\""                                                 -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE method #-}                                                           -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @min@ attribute.
--
-- Example:
--
-- > div ! min "bar" $ "Hello."
--
-- Result:
--
-- > <div min="bar">Hello.</div>
--
min :: AttributeValue  -- ^ Attribute value.                                    -- ./Util/GenerateHtmlCombinators.hs:260
    -> Attribute       -- ^ Resulting attribute.                                -- ./Util/GenerateHtmlCombinators.hs:261
min = attribute " min=\""                                                       -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE min #-}                                                              -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @multiple@ attribute.
--
-- Example:
--
-- > div ! multiple "bar" $ "Hello."
--
-- Result:
--
-- > <div multiple="bar">Hello.</div>
--
multiple :: AttributeValue  -- ^ Attribute value.                               -- ./Util/GenerateHtmlCombinators.hs:260
         -> Attribute       -- ^ Resulting attribute.                           -- ./Util/GenerateHtmlCombinators.hs:261
multiple = attribute " multiple=\""                                             -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE multiple #-}                                                         -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @name@ attribute.
--
-- Example:
--
-- > div ! name "bar" $ "Hello."
--
-- Result:
--
-- > <div name="bar">Hello.</div>
--
name :: AttributeValue  -- ^ Attribute value.                                   -- ./Util/GenerateHtmlCombinators.hs:260
     -> Attribute       -- ^ Resulting attribute.                               -- ./Util/GenerateHtmlCombinators.hs:261
name = attribute " name=\""                                                     -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE name #-}                                                             -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @novalidate@ attribute.
--
-- Example:
--
-- > div ! novalidate "bar" $ "Hello."
--
-- Result:
--
-- > <div novalidate="bar">Hello.</div>
--
novalidate :: AttributeValue  -- ^ Attribute value.                             -- ./Util/GenerateHtmlCombinators.hs:260
           -> Attribute       -- ^ Resulting attribute.                         -- ./Util/GenerateHtmlCombinators.hs:261
novalidate = attribute " novalidate=\""                                         -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE novalidate #-}                                                       -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onbeforeonload@ attribute.
--
-- Example:
--
-- > div ! onbeforeonload "bar" $ "Hello."
--
-- Result:
--
-- > <div onbeforeonload="bar">Hello.</div>
--
onbeforeonload :: AttributeValue  -- ^ Attribute value.                         -- ./Util/GenerateHtmlCombinators.hs:260
               -> Attribute       -- ^ Resulting attribute.                     -- ./Util/GenerateHtmlCombinators.hs:261
onbeforeonload = attribute " onbeforeonload=\""                                 -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onbeforeonload #-}                                                   -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onbeforeprint@ attribute.
--
-- Example:
--
-- > div ! onbeforeprint "bar" $ "Hello."
--
-- Result:
--
-- > <div onbeforeprint="bar">Hello.</div>
--
onbeforeprint :: AttributeValue  -- ^ Attribute value.                          -- ./Util/GenerateHtmlCombinators.hs:260
              -> Attribute       -- ^ Resulting attribute.                      -- ./Util/GenerateHtmlCombinators.hs:261
onbeforeprint = attribute " onbeforeprint=\""                                   -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onbeforeprint #-}                                                    -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @oncanplay@ attribute.
--
-- Example:
--
-- > div ! oncanplay "bar" $ "Hello."
--
-- Result:
--
-- > <div oncanplay="bar">Hello.</div>
--
oncanplay :: AttributeValue  -- ^ Attribute value.                              -- ./Util/GenerateHtmlCombinators.hs:260
          -> Attribute       -- ^ Resulting attribute.                          -- ./Util/GenerateHtmlCombinators.hs:261
oncanplay = attribute " oncanplay=\""                                           -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE oncanplay #-}                                                        -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @oncanplaythrough@ attribute.
--
-- Example:
--
-- > div ! oncanplaythrough "bar" $ "Hello."
--
-- Result:
--
-- > <div oncanplaythrough="bar">Hello.</div>
--
oncanplaythrough :: AttributeValue  -- ^ Attribute value.                       -- ./Util/GenerateHtmlCombinators.hs:260
                 -> Attribute       -- ^ Resulting attribute.                   -- ./Util/GenerateHtmlCombinators.hs:261
oncanplaythrough = attribute " oncanplaythrough=\""                             -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE oncanplaythrough #-}                                                 -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onchange@ attribute.
--
-- Example:
--
-- > div ! onchange "bar" $ "Hello."
--
-- Result:
--
-- > <div onchange="bar">Hello.</div>
--
onchange :: AttributeValue  -- ^ Attribute value.                               -- ./Util/GenerateHtmlCombinators.hs:260
         -> Attribute       -- ^ Resulting attribute.                           -- ./Util/GenerateHtmlCombinators.hs:261
onchange = attribute " onchange=\""                                             -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onchange #-}                                                         -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onclick@ attribute.
--
-- Example:
--
-- > div ! onclick "bar" $ "Hello."
--
-- Result:
--
-- > <div onclick="bar">Hello.</div>
--
onclick :: AttributeValue  -- ^ Attribute value.                                -- ./Util/GenerateHtmlCombinators.hs:260
        -> Attribute       -- ^ Resulting attribute.                            -- ./Util/GenerateHtmlCombinators.hs:261
onclick = attribute " onclick=\""                                               -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onclick #-}                                                          -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @oncontextmenu@ attribute.
--
-- Example:
--
-- > div ! oncontextmenu "bar" $ "Hello."
--
-- Result:
--
-- > <div oncontextmenu="bar">Hello.</div>
--
oncontextmenu :: AttributeValue  -- ^ Attribute value.                          -- ./Util/GenerateHtmlCombinators.hs:260
              -> Attribute       -- ^ Resulting attribute.                      -- ./Util/GenerateHtmlCombinators.hs:261
oncontextmenu = attribute " oncontextmenu=\""                                   -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE oncontextmenu #-}                                                    -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @ondblclick@ attribute.
--
-- Example:
--
-- > div ! ondblclick "bar" $ "Hello."
--
-- Result:
--
-- > <div ondblclick="bar">Hello.</div>
--
ondblclick :: AttributeValue  -- ^ Attribute value.                             -- ./Util/GenerateHtmlCombinators.hs:260
           -> Attribute       -- ^ Resulting attribute.                         -- ./Util/GenerateHtmlCombinators.hs:261
ondblclick = attribute " ondblclick=\""                                         -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE ondblclick #-}                                                       -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @ondrag@ attribute.
--
-- Example:
--
-- > div ! ondrag "bar" $ "Hello."
--
-- Result:
--
-- > <div ondrag="bar">Hello.</div>
--
ondrag :: AttributeValue  -- ^ Attribute value.                                 -- ./Util/GenerateHtmlCombinators.hs:260
       -> Attribute       -- ^ Resulting attribute.                             -- ./Util/GenerateHtmlCombinators.hs:261
ondrag = attribute " ondrag=\""                                                 -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE ondrag #-}                                                           -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @ondragend@ attribute.
--
-- Example:
--
-- > div ! ondragend "bar" $ "Hello."
--
-- Result:
--
-- > <div ondragend="bar">Hello.</div>
--
ondragend :: AttributeValue  -- ^ Attribute value.                              -- ./Util/GenerateHtmlCombinators.hs:260
          -> Attribute       -- ^ Resulting attribute.                          -- ./Util/GenerateHtmlCombinators.hs:261
ondragend = attribute " ondragend=\""                                           -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE ondragend #-}                                                        -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @ondragenter@ attribute.
--
-- Example:
--
-- > div ! ondragenter "bar" $ "Hello."
--
-- Result:
--
-- > <div ondragenter="bar">Hello.</div>
--
ondragenter :: AttributeValue  -- ^ Attribute value.                            -- ./Util/GenerateHtmlCombinators.hs:260
            -> Attribute       -- ^ Resulting attribute.                        -- ./Util/GenerateHtmlCombinators.hs:261
ondragenter = attribute " ondragenter=\""                                       -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE ondragenter #-}                                                      -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @ondragleave@ attribute.
--
-- Example:
--
-- > div ! ondragleave "bar" $ "Hello."
--
-- Result:
--
-- > <div ondragleave="bar">Hello.</div>
--
ondragleave :: AttributeValue  -- ^ Attribute value.                            -- ./Util/GenerateHtmlCombinators.hs:260
            -> Attribute       -- ^ Resulting attribute.                        -- ./Util/GenerateHtmlCombinators.hs:261
ondragleave = attribute " ondragleave=\""                                       -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE ondragleave #-}                                                      -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @ondragover@ attribute.
--
-- Example:
--
-- > div ! ondragover "bar" $ "Hello."
--
-- Result:
--
-- > <div ondragover="bar">Hello.</div>
--
ondragover :: AttributeValue  -- ^ Attribute value.                             -- ./Util/GenerateHtmlCombinators.hs:260
           -> Attribute       -- ^ Resulting attribute.                         -- ./Util/GenerateHtmlCombinators.hs:261
ondragover = attribute " ondragover=\""                                         -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE ondragover #-}                                                       -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @ondragstart@ attribute.
--
-- Example:
--
-- > div ! ondragstart "bar" $ "Hello."
--
-- Result:
--
-- > <div ondragstart="bar">Hello.</div>
--
ondragstart :: AttributeValue  -- ^ Attribute value.                            -- ./Util/GenerateHtmlCombinators.hs:260
            -> Attribute       -- ^ Resulting attribute.                        -- ./Util/GenerateHtmlCombinators.hs:261
ondragstart = attribute " ondragstart=\""                                       -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE ondragstart #-}                                                      -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @ondrop@ attribute.
--
-- Example:
--
-- > div ! ondrop "bar" $ "Hello."
--
-- Result:
--
-- > <div ondrop="bar">Hello.</div>
--
ondrop :: AttributeValue  -- ^ Attribute value.                                 -- ./Util/GenerateHtmlCombinators.hs:260
       -> Attribute       -- ^ Resulting attribute.                             -- ./Util/GenerateHtmlCombinators.hs:261
ondrop = attribute " ondrop=\""                                                 -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE ondrop #-}                                                           -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @ondurationchange@ attribute.
--
-- Example:
--
-- > div ! ondurationchange "bar" $ "Hello."
--
-- Result:
--
-- > <div ondurationchange="bar">Hello.</div>
--
ondurationchange :: AttributeValue  -- ^ Attribute value.                       -- ./Util/GenerateHtmlCombinators.hs:260
                 -> Attribute       -- ^ Resulting attribute.                   -- ./Util/GenerateHtmlCombinators.hs:261
ondurationchange = attribute " ondurationchange=\""                             -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE ondurationchange #-}                                                 -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onemptied@ attribute.
--
-- Example:
--
-- > div ! onemptied "bar" $ "Hello."
--
-- Result:
--
-- > <div onemptied="bar">Hello.</div>
--
onemptied :: AttributeValue  -- ^ Attribute value.                              -- ./Util/GenerateHtmlCombinators.hs:260
          -> Attribute       -- ^ Resulting attribute.                          -- ./Util/GenerateHtmlCombinators.hs:261
onemptied = attribute " onemptied=\""                                           -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onemptied #-}                                                        -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onended@ attribute.
--
-- Example:
--
-- > div ! onended "bar" $ "Hello."
--
-- Result:
--
-- > <div onended="bar">Hello.</div>
--
onended :: AttributeValue  -- ^ Attribute value.                                -- ./Util/GenerateHtmlCombinators.hs:260
        -> Attribute       -- ^ Resulting attribute.                            -- ./Util/GenerateHtmlCombinators.hs:261
onended = attribute " onended=\""                                               -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onended #-}                                                          -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onerror@ attribute.
--
-- Example:
--
-- > div ! onerror "bar" $ "Hello."
--
-- Result:
--
-- > <div onerror="bar">Hello.</div>
--
onerror :: AttributeValue  -- ^ Attribute value.                                -- ./Util/GenerateHtmlCombinators.hs:260
        -> Attribute       -- ^ Resulting attribute.                            -- ./Util/GenerateHtmlCombinators.hs:261
onerror = attribute " onerror=\""                                               -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onerror #-}                                                          -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onfocus@ attribute.
--
-- Example:
--
-- > div ! onfocus "bar" $ "Hello."
--
-- Result:
--
-- > <div onfocus="bar">Hello.</div>
--
onfocus :: AttributeValue  -- ^ Attribute value.                                -- ./Util/GenerateHtmlCombinators.hs:260
        -> Attribute       -- ^ Resulting attribute.                            -- ./Util/GenerateHtmlCombinators.hs:261
onfocus = attribute " onfocus=\""                                               -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onfocus #-}                                                          -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onformchange@ attribute.
--
-- Example:
--
-- > div ! onformchange "bar" $ "Hello."
--
-- Result:
--
-- > <div onformchange="bar">Hello.</div>
--
onformchange :: AttributeValue  -- ^ Attribute value.                           -- ./Util/GenerateHtmlCombinators.hs:260
             -> Attribute       -- ^ Resulting attribute.                       -- ./Util/GenerateHtmlCombinators.hs:261
onformchange = attribute " onformchange=\""                                     -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onformchange #-}                                                     -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onforminput@ attribute.
--
-- Example:
--
-- > div ! onforminput "bar" $ "Hello."
--
-- Result:
--
-- > <div onforminput="bar">Hello.</div>
--
onforminput :: AttributeValue  -- ^ Attribute value.                            -- ./Util/GenerateHtmlCombinators.hs:260
            -> Attribute       -- ^ Resulting attribute.                        -- ./Util/GenerateHtmlCombinators.hs:261
onforminput = attribute " onforminput=\""                                       -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onforminput #-}                                                      -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onhaschange@ attribute.
--
-- Example:
--
-- > div ! onhaschange "bar" $ "Hello."
--
-- Result:
--
-- > <div onhaschange="bar">Hello.</div>
--
onhaschange :: AttributeValue  -- ^ Attribute value.                            -- ./Util/GenerateHtmlCombinators.hs:260
            -> Attribute       -- ^ Resulting attribute.                        -- ./Util/GenerateHtmlCombinators.hs:261
onhaschange = attribute " onhaschange=\""                                       -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onhaschange #-}                                                      -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @oninput@ attribute.
--
-- Example:
--
-- > div ! oninput "bar" $ "Hello."
--
-- Result:
--
-- > <div oninput="bar">Hello.</div>
--
oninput :: AttributeValue  -- ^ Attribute value.                                -- ./Util/GenerateHtmlCombinators.hs:260
        -> Attribute       -- ^ Resulting attribute.                            -- ./Util/GenerateHtmlCombinators.hs:261
oninput = attribute " oninput=\""                                               -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE oninput #-}                                                          -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @oninvalid@ attribute.
--
-- Example:
--
-- > div ! oninvalid "bar" $ "Hello."
--
-- Result:
--
-- > <div oninvalid="bar">Hello.</div>
--
oninvalid :: AttributeValue  -- ^ Attribute value.                              -- ./Util/GenerateHtmlCombinators.hs:260
          -> Attribute       -- ^ Resulting attribute.                          -- ./Util/GenerateHtmlCombinators.hs:261
oninvalid = attribute " oninvalid=\""                                           -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE oninvalid #-}                                                        -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onkeydown@ attribute.
--
-- Example:
--
-- > div ! onkeydown "bar" $ "Hello."
--
-- Result:
--
-- > <div onkeydown="bar">Hello.</div>
--
onkeydown :: AttributeValue  -- ^ Attribute value.                              -- ./Util/GenerateHtmlCombinators.hs:260
          -> Attribute       -- ^ Resulting attribute.                          -- ./Util/GenerateHtmlCombinators.hs:261
onkeydown = attribute " onkeydown=\""                                           -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onkeydown #-}                                                        -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onkeyup@ attribute.
--
-- Example:
--
-- > div ! onkeyup "bar" $ "Hello."
--
-- Result:
--
-- > <div onkeyup="bar">Hello.</div>
--
onkeyup :: AttributeValue  -- ^ Attribute value.                                -- ./Util/GenerateHtmlCombinators.hs:260
        -> Attribute       -- ^ Resulting attribute.                            -- ./Util/GenerateHtmlCombinators.hs:261
onkeyup = attribute " onkeyup=\""                                               -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onkeyup #-}                                                          -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onload@ attribute.
--
-- Example:
--
-- > div ! onload "bar" $ "Hello."
--
-- Result:
--
-- > <div onload="bar">Hello.</div>
--
onload :: AttributeValue  -- ^ Attribute value.                                 -- ./Util/GenerateHtmlCombinators.hs:260
       -> Attribute       -- ^ Resulting attribute.                             -- ./Util/GenerateHtmlCombinators.hs:261
onload = attribute " onload=\""                                                 -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onload #-}                                                           -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onloadeddata@ attribute.
--
-- Example:
--
-- > div ! onloadeddata "bar" $ "Hello."
--
-- Result:
--
-- > <div onloadeddata="bar">Hello.</div>
--
onloadeddata :: AttributeValue  -- ^ Attribute value.                           -- ./Util/GenerateHtmlCombinators.hs:260
             -> Attribute       -- ^ Resulting attribute.                       -- ./Util/GenerateHtmlCombinators.hs:261
onloadeddata = attribute " onloadeddata=\""                                     -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onloadeddata #-}                                                     -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onloadedmetadata@ attribute.
--
-- Example:
--
-- > div ! onloadedmetadata "bar" $ "Hello."
--
-- Result:
--
-- > <div onloadedmetadata="bar">Hello.</div>
--
onloadedmetadata :: AttributeValue  -- ^ Attribute value.                       -- ./Util/GenerateHtmlCombinators.hs:260
                 -> Attribute       -- ^ Resulting attribute.                   -- ./Util/GenerateHtmlCombinators.hs:261
onloadedmetadata = attribute " onloadedmetadata=\""                             -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onloadedmetadata #-}                                                 -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onloadstart@ attribute.
--
-- Example:
--
-- > div ! onloadstart "bar" $ "Hello."
--
-- Result:
--
-- > <div onloadstart="bar">Hello.</div>
--
onloadstart :: AttributeValue  -- ^ Attribute value.                            -- ./Util/GenerateHtmlCombinators.hs:260
            -> Attribute       -- ^ Resulting attribute.                        -- ./Util/GenerateHtmlCombinators.hs:261
onloadstart = attribute " onloadstart=\""                                       -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onloadstart #-}                                                      -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onmessage@ attribute.
--
-- Example:
--
-- > div ! onmessage "bar" $ "Hello."
--
-- Result:
--
-- > <div onmessage="bar">Hello.</div>
--
onmessage :: AttributeValue  -- ^ Attribute value.                              -- ./Util/GenerateHtmlCombinators.hs:260
          -> Attribute       -- ^ Resulting attribute.                          -- ./Util/GenerateHtmlCombinators.hs:261
onmessage = attribute " onmessage=\""                                           -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onmessage #-}                                                        -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onmousedown@ attribute.
--
-- Example:
--
-- > div ! onmousedown "bar" $ "Hello."
--
-- Result:
--
-- > <div onmousedown="bar">Hello.</div>
--
onmousedown :: AttributeValue  -- ^ Attribute value.                            -- ./Util/GenerateHtmlCombinators.hs:260
            -> Attribute       -- ^ Resulting attribute.                        -- ./Util/GenerateHtmlCombinators.hs:261
onmousedown = attribute " onmousedown=\""                                       -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onmousedown #-}                                                      -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onmousemove@ attribute.
--
-- Example:
--
-- > div ! onmousemove "bar" $ "Hello."
--
-- Result:
--
-- > <div onmousemove="bar">Hello.</div>
--
onmousemove :: AttributeValue  -- ^ Attribute value.                            -- ./Util/GenerateHtmlCombinators.hs:260
            -> Attribute       -- ^ Resulting attribute.                        -- ./Util/GenerateHtmlCombinators.hs:261
onmousemove = attribute " onmousemove=\""                                       -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onmousemove #-}                                                      -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onmouseout@ attribute.
--
-- Example:
--
-- > div ! onmouseout "bar" $ "Hello."
--
-- Result:
--
-- > <div onmouseout="bar">Hello.</div>
--
onmouseout :: AttributeValue  -- ^ Attribute value.                             -- ./Util/GenerateHtmlCombinators.hs:260
           -> Attribute       -- ^ Resulting attribute.                         -- ./Util/GenerateHtmlCombinators.hs:261
onmouseout = attribute " onmouseout=\""                                         -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onmouseout #-}                                                       -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onmouseover@ attribute.
--
-- Example:
--
-- > div ! onmouseover "bar" $ "Hello."
--
-- Result:
--
-- > <div onmouseover="bar">Hello.</div>
--
onmouseover :: AttributeValue  -- ^ Attribute value.                            -- ./Util/GenerateHtmlCombinators.hs:260
            -> Attribute       -- ^ Resulting attribute.                        -- ./Util/GenerateHtmlCombinators.hs:261
onmouseover = attribute " onmouseover=\""                                       -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onmouseover #-}                                                      -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onmouseup@ attribute.
--
-- Example:
--
-- > div ! onmouseup "bar" $ "Hello."
--
-- Result:
--
-- > <div onmouseup="bar">Hello.</div>
--
onmouseup :: AttributeValue  -- ^ Attribute value.                              -- ./Util/GenerateHtmlCombinators.hs:260
          -> Attribute       -- ^ Resulting attribute.                          -- ./Util/GenerateHtmlCombinators.hs:261
onmouseup = attribute " onmouseup=\""                                           -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onmouseup #-}                                                        -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onmousewheel@ attribute.
--
-- Example:
--
-- > div ! onmousewheel "bar" $ "Hello."
--
-- Result:
--
-- > <div onmousewheel="bar">Hello.</div>
--
onmousewheel :: AttributeValue  -- ^ Attribute value.                           -- ./Util/GenerateHtmlCombinators.hs:260
             -> Attribute       -- ^ Resulting attribute.                       -- ./Util/GenerateHtmlCombinators.hs:261
onmousewheel = attribute " onmousewheel=\""                                     -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onmousewheel #-}                                                     -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @ononline@ attribute.
--
-- Example:
--
-- > div ! ononline "bar" $ "Hello."
--
-- Result:
--
-- > <div ononline="bar">Hello.</div>
--
ononline :: AttributeValue  -- ^ Attribute value.                               -- ./Util/GenerateHtmlCombinators.hs:260
         -> Attribute       -- ^ Resulting attribute.                           -- ./Util/GenerateHtmlCombinators.hs:261
ononline = attribute " ononline=\""                                             -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE ononline #-}                                                         -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onpagehide@ attribute.
--
-- Example:
--
-- > div ! onpagehide "bar" $ "Hello."
--
-- Result:
--
-- > <div onpagehide="bar">Hello.</div>
--
onpagehide :: AttributeValue  -- ^ Attribute value.                             -- ./Util/GenerateHtmlCombinators.hs:260
           -> Attribute       -- ^ Resulting attribute.                         -- ./Util/GenerateHtmlCombinators.hs:261
onpagehide = attribute " onpagehide=\""                                         -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onpagehide #-}                                                       -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onpageshow@ attribute.
--
-- Example:
--
-- > div ! onpageshow "bar" $ "Hello."
--
-- Result:
--
-- > <div onpageshow="bar">Hello.</div>
--
onpageshow :: AttributeValue  -- ^ Attribute value.                             -- ./Util/GenerateHtmlCombinators.hs:260
           -> Attribute       -- ^ Resulting attribute.                         -- ./Util/GenerateHtmlCombinators.hs:261
onpageshow = attribute " onpageshow=\""                                         -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onpageshow #-}                                                       -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onpause@ attribute.
--
-- Example:
--
-- > div ! onpause "bar" $ "Hello."
--
-- Result:
--
-- > <div onpause="bar">Hello.</div>
--
onpause :: AttributeValue  -- ^ Attribute value.                                -- ./Util/GenerateHtmlCombinators.hs:260
        -> Attribute       -- ^ Resulting attribute.                            -- ./Util/GenerateHtmlCombinators.hs:261
onpause = attribute " onpause=\""                                               -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onpause #-}                                                          -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onplay@ attribute.
--
-- Example:
--
-- > div ! onplay "bar" $ "Hello."
--
-- Result:
--
-- > <div onplay="bar">Hello.</div>
--
onplay :: AttributeValue  -- ^ Attribute value.                                 -- ./Util/GenerateHtmlCombinators.hs:260
       -> Attribute       -- ^ Resulting attribute.                             -- ./Util/GenerateHtmlCombinators.hs:261
onplay = attribute " onplay=\""                                                 -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onplay #-}                                                           -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onplaying@ attribute.
--
-- Example:
--
-- > div ! onplaying "bar" $ "Hello."
--
-- Result:
--
-- > <div onplaying="bar">Hello.</div>
--
onplaying :: AttributeValue  -- ^ Attribute value.                              -- ./Util/GenerateHtmlCombinators.hs:260
          -> Attribute       -- ^ Resulting attribute.                          -- ./Util/GenerateHtmlCombinators.hs:261
onplaying = attribute " onplaying=\""                                           -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onplaying #-}                                                        -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onprogress@ attribute.
--
-- Example:
--
-- > div ! onprogress "bar" $ "Hello."
--
-- Result:
--
-- > <div onprogress="bar">Hello.</div>
--
onprogress :: AttributeValue  -- ^ Attribute value.                             -- ./Util/GenerateHtmlCombinators.hs:260
           -> Attribute       -- ^ Resulting attribute.                         -- ./Util/GenerateHtmlCombinators.hs:261
onprogress = attribute " onprogress=\""                                         -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onprogress #-}                                                       -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onpropstate@ attribute.
--
-- Example:
--
-- > div ! onpropstate "bar" $ "Hello."
--
-- Result:
--
-- > <div onpropstate="bar">Hello.</div>
--
onpropstate :: AttributeValue  -- ^ Attribute value.                            -- ./Util/GenerateHtmlCombinators.hs:260
            -> Attribute       -- ^ Resulting attribute.                        -- ./Util/GenerateHtmlCombinators.hs:261
onpropstate = attribute " onpropstate=\""                                       -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onpropstate #-}                                                      -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onratechange@ attribute.
--
-- Example:
--
-- > div ! onratechange "bar" $ "Hello."
--
-- Result:
--
-- > <div onratechange="bar">Hello.</div>
--
onratechange :: AttributeValue  -- ^ Attribute value.                           -- ./Util/GenerateHtmlCombinators.hs:260
             -> Attribute       -- ^ Resulting attribute.                       -- ./Util/GenerateHtmlCombinators.hs:261
onratechange = attribute " onratechange=\""                                     -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onratechange #-}                                                     -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onreadystatechange@ attribute.
--
-- Example:
--
-- > div ! onreadystatechange "bar" $ "Hello."
--
-- Result:
--
-- > <div onreadystatechange="bar">Hello.</div>
--
onreadystatechange :: AttributeValue  -- ^ Attribute value.                     -- ./Util/GenerateHtmlCombinators.hs:260
                   -> Attribute       -- ^ Resulting attribute.                 -- ./Util/GenerateHtmlCombinators.hs:261
onreadystatechange = attribute " onreadystatechange=\""                         -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onreadystatechange #-}                                               -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onredo@ attribute.
--
-- Example:
--
-- > div ! onredo "bar" $ "Hello."
--
-- Result:
--
-- > <div onredo="bar">Hello.</div>
--
onredo :: AttributeValue  -- ^ Attribute value.                                 -- ./Util/GenerateHtmlCombinators.hs:260
       -> Attribute       -- ^ Resulting attribute.                             -- ./Util/GenerateHtmlCombinators.hs:261
onredo = attribute " onredo=\""                                                 -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onredo #-}                                                           -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onresize@ attribute.
--
-- Example:
--
-- > div ! onresize "bar" $ "Hello."
--
-- Result:
--
-- > <div onresize="bar">Hello.</div>
--
onresize :: AttributeValue  -- ^ Attribute value.                               -- ./Util/GenerateHtmlCombinators.hs:260
         -> Attribute       -- ^ Resulting attribute.                           -- ./Util/GenerateHtmlCombinators.hs:261
onresize = attribute " onresize=\""                                             -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onresize #-}                                                         -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onscroll@ attribute.
--
-- Example:
--
-- > div ! onscroll "bar" $ "Hello."
--
-- Result:
--
-- > <div onscroll="bar">Hello.</div>
--
onscroll :: AttributeValue  -- ^ Attribute value.                               -- ./Util/GenerateHtmlCombinators.hs:260
         -> Attribute       -- ^ Resulting attribute.                           -- ./Util/GenerateHtmlCombinators.hs:261
onscroll = attribute " onscroll=\""                                             -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onscroll #-}                                                         -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onseeked@ attribute.
--
-- Example:
--
-- > div ! onseeked "bar" $ "Hello."
--
-- Result:
--
-- > <div onseeked="bar">Hello.</div>
--
onseeked :: AttributeValue  -- ^ Attribute value.                               -- ./Util/GenerateHtmlCombinators.hs:260
         -> Attribute       -- ^ Resulting attribute.                           -- ./Util/GenerateHtmlCombinators.hs:261
onseeked = attribute " onseeked=\""                                             -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onseeked #-}                                                         -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onseeking@ attribute.
--
-- Example:
--
-- > div ! onseeking "bar" $ "Hello."
--
-- Result:
--
-- > <div onseeking="bar">Hello.</div>
--
onseeking :: AttributeValue  -- ^ Attribute value.                              -- ./Util/GenerateHtmlCombinators.hs:260
          -> Attribute       -- ^ Resulting attribute.                          -- ./Util/GenerateHtmlCombinators.hs:261
onseeking = attribute " onseeking=\""                                           -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onseeking #-}                                                        -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onselect@ attribute.
--
-- Example:
--
-- > div ! onselect "bar" $ "Hello."
--
-- Result:
--
-- > <div onselect="bar">Hello.</div>
--
onselect :: AttributeValue  -- ^ Attribute value.                               -- ./Util/GenerateHtmlCombinators.hs:260
         -> Attribute       -- ^ Resulting attribute.                           -- ./Util/GenerateHtmlCombinators.hs:261
onselect = attribute " onselect=\""                                             -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onselect #-}                                                         -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onstalled@ attribute.
--
-- Example:
--
-- > div ! onstalled "bar" $ "Hello."
--
-- Result:
--
-- > <div onstalled="bar">Hello.</div>
--
onstalled :: AttributeValue  -- ^ Attribute value.                              -- ./Util/GenerateHtmlCombinators.hs:260
          -> Attribute       -- ^ Resulting attribute.                          -- ./Util/GenerateHtmlCombinators.hs:261
onstalled = attribute " onstalled=\""                                           -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onstalled #-}                                                        -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onstorage@ attribute.
--
-- Example:
--
-- > div ! onstorage "bar" $ "Hello."
--
-- Result:
--
-- > <div onstorage="bar">Hello.</div>
--
onstorage :: AttributeValue  -- ^ Attribute value.                              -- ./Util/GenerateHtmlCombinators.hs:260
          -> Attribute       -- ^ Resulting attribute.                          -- ./Util/GenerateHtmlCombinators.hs:261
onstorage = attribute " onstorage=\""                                           -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onstorage #-}                                                        -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onsubmit@ attribute.
--
-- Example:
--
-- > div ! onsubmit "bar" $ "Hello."
--
-- Result:
--
-- > <div onsubmit="bar">Hello.</div>
--
onsubmit :: AttributeValue  -- ^ Attribute value.                               -- ./Util/GenerateHtmlCombinators.hs:260
         -> Attribute       -- ^ Resulting attribute.                           -- ./Util/GenerateHtmlCombinators.hs:261
onsubmit = attribute " onsubmit=\""                                             -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onsubmit #-}                                                         -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onsuspend@ attribute.
--
-- Example:
--
-- > div ! onsuspend "bar" $ "Hello."
--
-- Result:
--
-- > <div onsuspend="bar">Hello.</div>
--
onsuspend :: AttributeValue  -- ^ Attribute value.                              -- ./Util/GenerateHtmlCombinators.hs:260
          -> Attribute       -- ^ Resulting attribute.                          -- ./Util/GenerateHtmlCombinators.hs:261
onsuspend = attribute " onsuspend=\""                                           -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onsuspend #-}                                                        -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @ontimeupdate@ attribute.
--
-- Example:
--
-- > div ! ontimeupdate "bar" $ "Hello."
--
-- Result:
--
-- > <div ontimeupdate="bar">Hello.</div>
--
ontimeupdate :: AttributeValue  -- ^ Attribute value.                           -- ./Util/GenerateHtmlCombinators.hs:260
             -> Attribute       -- ^ Resulting attribute.                       -- ./Util/GenerateHtmlCombinators.hs:261
ontimeupdate = attribute " ontimeupdate=\""                                     -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE ontimeupdate #-}                                                     -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onundo@ attribute.
--
-- Example:
--
-- > div ! onundo "bar" $ "Hello."
--
-- Result:
--
-- > <div onundo="bar">Hello.</div>
--
onundo :: AttributeValue  -- ^ Attribute value.                                 -- ./Util/GenerateHtmlCombinators.hs:260
       -> Attribute       -- ^ Resulting attribute.                             -- ./Util/GenerateHtmlCombinators.hs:261
onundo = attribute " onundo=\""                                                 -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onundo #-}                                                           -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onunload@ attribute.
--
-- Example:
--
-- > div ! onunload "bar" $ "Hello."
--
-- Result:
--
-- > <div onunload="bar">Hello.</div>
--
onunload :: AttributeValue  -- ^ Attribute value.                               -- ./Util/GenerateHtmlCombinators.hs:260
         -> Attribute       -- ^ Resulting attribute.                           -- ./Util/GenerateHtmlCombinators.hs:261
onunload = attribute " onunload=\""                                             -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onunload #-}                                                         -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onvolumechange@ attribute.
--
-- Example:
--
-- > div ! onvolumechange "bar" $ "Hello."
--
-- Result:
--
-- > <div onvolumechange="bar">Hello.</div>
--
onvolumechange :: AttributeValue  -- ^ Attribute value.                         -- ./Util/GenerateHtmlCombinators.hs:260
               -> Attribute       -- ^ Resulting attribute.                     -- ./Util/GenerateHtmlCombinators.hs:261
onvolumechange = attribute " onvolumechange=\""                                 -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onvolumechange #-}                                                   -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @onwaiting@ attribute.
--
-- Example:
--
-- > div ! onwaiting "bar" $ "Hello."
--
-- Result:
--
-- > <div onwaiting="bar">Hello.</div>
--
onwaiting :: AttributeValue  -- ^ Attribute value.                              -- ./Util/GenerateHtmlCombinators.hs:260
          -> Attribute       -- ^ Resulting attribute.                          -- ./Util/GenerateHtmlCombinators.hs:261
onwaiting = attribute " onwaiting=\""                                           -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE onwaiting #-}                                                        -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @open@ attribute.
--
-- Example:
--
-- > div ! open "bar" $ "Hello."
--
-- Result:
--
-- > <div open="bar">Hello.</div>
--
open :: AttributeValue  -- ^ Attribute value.                                   -- ./Util/GenerateHtmlCombinators.hs:260
     -> Attribute       -- ^ Resulting attribute.                               -- ./Util/GenerateHtmlCombinators.hs:261
open = attribute " open=\""                                                     -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE open #-}                                                             -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @optimum@ attribute.
--
-- Example:
--
-- > div ! optimum "bar" $ "Hello."
--
-- Result:
--
-- > <div optimum="bar">Hello.</div>
--
optimum :: AttributeValue  -- ^ Attribute value.                                -- ./Util/GenerateHtmlCombinators.hs:260
        -> Attribute       -- ^ Resulting attribute.                            -- ./Util/GenerateHtmlCombinators.hs:261
optimum = attribute " optimum=\""                                               -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE optimum #-}                                                          -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @pattern@ attribute.
--
-- Example:
--
-- > div ! pattern "bar" $ "Hello."
--
-- Result:
--
-- > <div pattern="bar">Hello.</div>
--
pattern :: AttributeValue  -- ^ Attribute value.                                -- ./Util/GenerateHtmlCombinators.hs:260
        -> Attribute       -- ^ Resulting attribute.                            -- ./Util/GenerateHtmlCombinators.hs:261
pattern = attribute " pattern=\""                                               -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE pattern #-}                                                          -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @ping@ attribute.
--
-- Example:
--
-- > div ! ping "bar" $ "Hello."
--
-- Result:
--
-- > <div ping="bar">Hello.</div>
--
ping :: AttributeValue  -- ^ Attribute value.                                   -- ./Util/GenerateHtmlCombinators.hs:260
     -> Attribute       -- ^ Resulting attribute.                               -- ./Util/GenerateHtmlCombinators.hs:261
ping = attribute " ping=\""                                                     -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE ping #-}                                                             -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @placeholder@ attribute.
--
-- Example:
--
-- > div ! placeholder "bar" $ "Hello."
--
-- Result:
--
-- > <div placeholder="bar">Hello.</div>
--
placeholder :: AttributeValue  -- ^ Attribute value.                            -- ./Util/GenerateHtmlCombinators.hs:260
            -> Attribute       -- ^ Resulting attribute.                        -- ./Util/GenerateHtmlCombinators.hs:261
placeholder = attribute " placeholder=\""                                       -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE placeholder #-}                                                      -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @preload@ attribute.
--
-- Example:
--
-- > div ! preload "bar" $ "Hello."
--
-- Result:
--
-- > <div preload="bar">Hello.</div>
--
preload :: AttributeValue  -- ^ Attribute value.                                -- ./Util/GenerateHtmlCombinators.hs:260
        -> Attribute       -- ^ Resulting attribute.                            -- ./Util/GenerateHtmlCombinators.hs:261
preload = attribute " preload=\""                                               -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE preload #-}                                                          -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @pubdate@ attribute.
--
-- Example:
--
-- > div ! pubdate "bar" $ "Hello."
--
-- Result:
--
-- > <div pubdate="bar">Hello.</div>
--
pubdate :: AttributeValue  -- ^ Attribute value.                                -- ./Util/GenerateHtmlCombinators.hs:260
        -> Attribute       -- ^ Resulting attribute.                            -- ./Util/GenerateHtmlCombinators.hs:261
pubdate = attribute " pubdate=\""                                               -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE pubdate #-}                                                          -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @radiogroup@ attribute.
--
-- Example:
--
-- > div ! radiogroup "bar" $ "Hello."
--
-- Result:
--
-- > <div radiogroup="bar">Hello.</div>
--
radiogroup :: AttributeValue  -- ^ Attribute value.                             -- ./Util/GenerateHtmlCombinators.hs:260
           -> Attribute       -- ^ Resulting attribute.                         -- ./Util/GenerateHtmlCombinators.hs:261
radiogroup = attribute " radiogroup=\""                                         -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE radiogroup #-}                                                       -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @readonly@ attribute.
--
-- Example:
--
-- > div ! readonly "bar" $ "Hello."
--
-- Result:
--
-- > <div readonly="bar">Hello.</div>
--
readonly :: AttributeValue  -- ^ Attribute value.                               -- ./Util/GenerateHtmlCombinators.hs:260
         -> Attribute       -- ^ Resulting attribute.                           -- ./Util/GenerateHtmlCombinators.hs:261
readonly = attribute " readonly=\""                                             -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE readonly #-}                                                         -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @rel@ attribute.
--
-- Example:
--
-- > div ! rel "bar" $ "Hello."
--
-- Result:
--
-- > <div rel="bar">Hello.</div>
--
rel :: AttributeValue  -- ^ Attribute value.                                    -- ./Util/GenerateHtmlCombinators.hs:260
    -> Attribute       -- ^ Resulting attribute.                                -- ./Util/GenerateHtmlCombinators.hs:261
rel = attribute " rel=\""                                                       -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE rel #-}                                                              -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @required@ attribute.
--
-- Example:
--
-- > div ! required "bar" $ "Hello."
--
-- Result:
--
-- > <div required="bar">Hello.</div>
--
required :: AttributeValue  -- ^ Attribute value.                               -- ./Util/GenerateHtmlCombinators.hs:260
         -> Attribute       -- ^ Resulting attribute.                           -- ./Util/GenerateHtmlCombinators.hs:261
required = attribute " required=\""                                             -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE required #-}                                                         -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @reversed@ attribute.
--
-- Example:
--
-- > div ! reversed "bar" $ "Hello."
--
-- Result:
--
-- > <div reversed="bar">Hello.</div>
--
reversed :: AttributeValue  -- ^ Attribute value.                               -- ./Util/GenerateHtmlCombinators.hs:260
         -> Attribute       -- ^ Resulting attribute.                           -- ./Util/GenerateHtmlCombinators.hs:261
reversed = attribute " reversed=\""                                             -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE reversed #-}                                                         -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @rows@ attribute.
--
-- Example:
--
-- > div ! rows "bar" $ "Hello."
--
-- Result:
--
-- > <div rows="bar">Hello.</div>
--
rows :: AttributeValue  -- ^ Attribute value.                                   -- ./Util/GenerateHtmlCombinators.hs:260
     -> Attribute       -- ^ Resulting attribute.                               -- ./Util/GenerateHtmlCombinators.hs:261
rows = attribute " rows=\""                                                     -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE rows #-}                                                             -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @rowspan@ attribute.
--
-- Example:
--
-- > div ! rowspan "bar" $ "Hello."
--
-- Result:
--
-- > <div rowspan="bar">Hello.</div>
--
rowspan :: AttributeValue  -- ^ Attribute value.                                -- ./Util/GenerateHtmlCombinators.hs:260
        -> Attribute       -- ^ Resulting attribute.                            -- ./Util/GenerateHtmlCombinators.hs:261
rowspan = attribute " rowspan=\""                                               -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE rowspan #-}                                                          -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @sandbox@ attribute.
--
-- Example:
--
-- > div ! sandbox "bar" $ "Hello."
--
-- Result:
--
-- > <div sandbox="bar">Hello.</div>
--
sandbox :: AttributeValue  -- ^ Attribute value.                                -- ./Util/GenerateHtmlCombinators.hs:260
        -> Attribute       -- ^ Resulting attribute.                            -- ./Util/GenerateHtmlCombinators.hs:261
sandbox = attribute " sandbox=\""                                               -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE sandbox #-}                                                          -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @scope@ attribute.
--
-- Example:
--
-- > div ! scope "bar" $ "Hello."
--
-- Result:
--
-- > <div scope="bar">Hello.</div>
--
scope :: AttributeValue  -- ^ Attribute value.                                  -- ./Util/GenerateHtmlCombinators.hs:260
      -> Attribute       -- ^ Resulting attribute.                              -- ./Util/GenerateHtmlCombinators.hs:261
scope = attribute " scope=\""                                                   -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE scope #-}                                                            -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @scoped@ attribute.
--
-- Example:
--
-- > div ! scoped "bar" $ "Hello."
--
-- Result:
--
-- > <div scoped="bar">Hello.</div>
--
scoped :: AttributeValue  -- ^ Attribute value.                                 -- ./Util/GenerateHtmlCombinators.hs:260
       -> Attribute       -- ^ Resulting attribute.                             -- ./Util/GenerateHtmlCombinators.hs:261
scoped = attribute " scoped=\""                                                 -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE scoped #-}                                                           -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @seamless@ attribute.
--
-- Example:
--
-- > div ! seamless "bar" $ "Hello."
--
-- Result:
--
-- > <div seamless="bar">Hello.</div>
--
seamless :: AttributeValue  -- ^ Attribute value.                               -- ./Util/GenerateHtmlCombinators.hs:260
         -> Attribute       -- ^ Resulting attribute.                           -- ./Util/GenerateHtmlCombinators.hs:261
seamless = attribute " seamless=\""                                             -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE seamless #-}                                                         -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @selected@ attribute.
--
-- Example:
--
-- > div ! selected "bar" $ "Hello."
--
-- Result:
--
-- > <div selected="bar">Hello.</div>
--
selected :: AttributeValue  -- ^ Attribute value.                               -- ./Util/GenerateHtmlCombinators.hs:260
         -> Attribute       -- ^ Resulting attribute.                           -- ./Util/GenerateHtmlCombinators.hs:261
selected = attribute " selected=\""                                             -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE selected #-}                                                         -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @shape@ attribute.
--
-- Example:
--
-- > div ! shape "bar" $ "Hello."
--
-- Result:
--
-- > <div shape="bar">Hello.</div>
--
shape :: AttributeValue  -- ^ Attribute value.                                  -- ./Util/GenerateHtmlCombinators.hs:260
      -> Attribute       -- ^ Resulting attribute.                              -- ./Util/GenerateHtmlCombinators.hs:261
shape = attribute " shape=\""                                                   -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE shape #-}                                                            -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @size@ attribute.
--
-- Example:
--
-- > div ! size "bar" $ "Hello."
--
-- Result:
--
-- > <div size="bar">Hello.</div>
--
size :: AttributeValue  -- ^ Attribute value.                                   -- ./Util/GenerateHtmlCombinators.hs:260
     -> Attribute       -- ^ Resulting attribute.                               -- ./Util/GenerateHtmlCombinators.hs:261
size = attribute " size=\""                                                     -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE size #-}                                                             -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @sizes@ attribute.
--
-- Example:
--
-- > div ! sizes "bar" $ "Hello."
--
-- Result:
--
-- > <div sizes="bar">Hello.</div>
--
sizes :: AttributeValue  -- ^ Attribute value.                                  -- ./Util/GenerateHtmlCombinators.hs:260
      -> Attribute       -- ^ Resulting attribute.                              -- ./Util/GenerateHtmlCombinators.hs:261
sizes = attribute " sizes=\""                                                   -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE sizes #-}                                                            -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @span@ attribute.
--
-- Example:
--
-- > div ! span "bar" $ "Hello."
--
-- Result:
--
-- > <div span="bar">Hello.</div>
--
span :: AttributeValue  -- ^ Attribute value.                                   -- ./Util/GenerateHtmlCombinators.hs:260
     -> Attribute       -- ^ Resulting attribute.                               -- ./Util/GenerateHtmlCombinators.hs:261
span = attribute " span=\""                                                     -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE span #-}                                                             -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @spellcheck@ attribute.
--
-- Example:
--
-- > div ! spellcheck "bar" $ "Hello."
--
-- Result:
--
-- > <div spellcheck="bar">Hello.</div>
--
spellcheck :: AttributeValue  -- ^ Attribute value.                             -- ./Util/GenerateHtmlCombinators.hs:260
           -> Attribute       -- ^ Resulting attribute.                         -- ./Util/GenerateHtmlCombinators.hs:261
spellcheck = attribute " spellcheck=\""                                         -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE spellcheck #-}                                                       -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @src@ attribute.
--
-- Example:
--
-- > div ! src "bar" $ "Hello."
--
-- Result:
--
-- > <div src="bar">Hello.</div>
--
src :: AttributeValue  -- ^ Attribute value.                                    -- ./Util/GenerateHtmlCombinators.hs:260
    -> Attribute       -- ^ Resulting attribute.                                -- ./Util/GenerateHtmlCombinators.hs:261
src = attribute " src=\""                                                       -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE src #-}                                                              -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @srcdoc@ attribute.
--
-- Example:
--
-- > div ! srcdoc "bar" $ "Hello."
--
-- Result:
--
-- > <div srcdoc="bar">Hello.</div>
--
srcdoc :: AttributeValue  -- ^ Attribute value.                                 -- ./Util/GenerateHtmlCombinators.hs:260
       -> Attribute       -- ^ Resulting attribute.                             -- ./Util/GenerateHtmlCombinators.hs:261
srcdoc = attribute " srcdoc=\""                                                 -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE srcdoc #-}                                                           -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @start@ attribute.
--
-- Example:
--
-- > div ! start "bar" $ "Hello."
--
-- Result:
--
-- > <div start="bar">Hello.</div>
--
start :: AttributeValue  -- ^ Attribute value.                                  -- ./Util/GenerateHtmlCombinators.hs:260
      -> Attribute       -- ^ Resulting attribute.                              -- ./Util/GenerateHtmlCombinators.hs:261
start = attribute " start=\""                                                   -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE start #-}                                                            -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @step@ attribute.
--
-- Example:
--
-- > div ! step "bar" $ "Hello."
--
-- Result:
--
-- > <div step="bar">Hello.</div>
--
step :: AttributeValue  -- ^ Attribute value.                                   -- ./Util/GenerateHtmlCombinators.hs:260
     -> Attribute       -- ^ Resulting attribute.                               -- ./Util/GenerateHtmlCombinators.hs:261
step = attribute " step=\""                                                     -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE step #-}                                                             -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @style@ attribute.
--
-- Example:
--
-- > div ! style "bar" $ "Hello."
--
-- Result:
--
-- > <div style="bar">Hello.</div>
--
style :: AttributeValue  -- ^ Attribute value.                                  -- ./Util/GenerateHtmlCombinators.hs:260
      -> Attribute       -- ^ Resulting attribute.                              -- ./Util/GenerateHtmlCombinators.hs:261
style = attribute " style=\""                                                   -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE style #-}                                                            -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @subject@ attribute.
--
-- Example:
--
-- > div ! subject "bar" $ "Hello."
--
-- Result:
--
-- > <div subject="bar">Hello.</div>
--
subject :: AttributeValue  -- ^ Attribute value.                                -- ./Util/GenerateHtmlCombinators.hs:260
        -> Attribute       -- ^ Resulting attribute.                            -- ./Util/GenerateHtmlCombinators.hs:261
subject = attribute " subject=\""                                               -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE subject #-}                                                          -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @summary@ attribute.
--
-- Example:
--
-- > div ! summary "bar" $ "Hello."
--
-- Result:
--
-- > <div summary="bar">Hello.</div>
--
summary :: AttributeValue  -- ^ Attribute value.                                -- ./Util/GenerateHtmlCombinators.hs:260
        -> Attribute       -- ^ Resulting attribute.                            -- ./Util/GenerateHtmlCombinators.hs:261
summary = attribute " summary=\""                                               -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE summary #-}                                                          -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @tabindex@ attribute.
--
-- Example:
--
-- > div ! tabindex "bar" $ "Hello."
--
-- Result:
--
-- > <div tabindex="bar">Hello.</div>
--
tabindex :: AttributeValue  -- ^ Attribute value.                               -- ./Util/GenerateHtmlCombinators.hs:260
         -> Attribute       -- ^ Resulting attribute.                           -- ./Util/GenerateHtmlCombinators.hs:261
tabindex = attribute " tabindex=\""                                             -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE tabindex #-}                                                         -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @target@ attribute.
--
-- Example:
--
-- > div ! target "bar" $ "Hello."
--
-- Result:
--
-- > <div target="bar">Hello.</div>
--
target :: AttributeValue  -- ^ Attribute value.                                 -- ./Util/GenerateHtmlCombinators.hs:260
       -> Attribute       -- ^ Resulting attribute.                             -- ./Util/GenerateHtmlCombinators.hs:261
target = attribute " target=\""                                                 -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE target #-}                                                           -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @title@ attribute.
--
-- Example:
--
-- > div ! title "bar" $ "Hello."
--
-- Result:
--
-- > <div title="bar">Hello.</div>
--
title :: AttributeValue  -- ^ Attribute value.                                  -- ./Util/GenerateHtmlCombinators.hs:260
      -> Attribute       -- ^ Resulting attribute.                              -- ./Util/GenerateHtmlCombinators.hs:261
title = attribute " title=\""                                                   -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE title #-}                                                            -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @type@ attribute.
--
-- Example:
--
-- > div ! type_ "bar" $ "Hello."
--
-- Result:
--
-- > <div type="bar">Hello.</div>
--
type_ :: AttributeValue  -- ^ Attribute value.                                  -- ./Util/GenerateHtmlCombinators.hs:260
      -> Attribute       -- ^ Resulting attribute.                              -- ./Util/GenerateHtmlCombinators.hs:261
type_ = attribute " type=\""                                                    -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE type_ #-}                                                            -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @usemap@ attribute.
--
-- Example:
--
-- > div ! usemap "bar" $ "Hello."
--
-- Result:
--
-- > <div usemap="bar">Hello.</div>
--
usemap :: AttributeValue  -- ^ Attribute value.                                 -- ./Util/GenerateHtmlCombinators.hs:260
       -> Attribute       -- ^ Resulting attribute.                             -- ./Util/GenerateHtmlCombinators.hs:261
usemap = attribute " usemap=\""                                                 -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE usemap #-}                                                           -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @value@ attribute.
--
-- Example:
--
-- > div ! value "bar" $ "Hello."
--
-- Result:
--
-- > <div value="bar">Hello.</div>
--
value :: AttributeValue  -- ^ Attribute value.                                  -- ./Util/GenerateHtmlCombinators.hs:260
      -> Attribute       -- ^ Resulting attribute.                              -- ./Util/GenerateHtmlCombinators.hs:261
value = attribute " value=\""                                                   -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE value #-}                                                            -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @width@ attribute.
--
-- Example:
--
-- > div ! width "bar" $ "Hello."
--
-- Result:
--
-- > <div width="bar">Hello.</div>
--
width :: AttributeValue  -- ^ Attribute value.                                  -- ./Util/GenerateHtmlCombinators.hs:260
      -> Attribute       -- ^ Resulting attribute.                              -- ./Util/GenerateHtmlCombinators.hs:261
width = attribute " width=\""                                                   -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE width #-}                                                            -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @wrap@ attribute.
--
-- Example:
--
-- > div ! wrap "bar" $ "Hello."
--
-- Result:
--
-- > <div wrap="bar">Hello.</div>
--
wrap :: AttributeValue  -- ^ Attribute value.                                   -- ./Util/GenerateHtmlCombinators.hs:260
     -> Attribute       -- ^ Resulting attribute.                               -- ./Util/GenerateHtmlCombinators.hs:261
wrap = attribute " wrap=\""                                                     -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE wrap #-}                                                             -- ./Util/GenerateHtmlCombinators.hs:263

-- | Combinator for the @xmlns@ attribute.
--
-- Example:
--
-- > div ! xmlns "bar" $ "Hello."
--
-- Result:
--
-- > <div xmlns="bar">Hello.</div>
--
xmlns :: AttributeValue  -- ^ Attribute value.                                  -- ./Util/GenerateHtmlCombinators.hs:260
      -> Attribute       -- ^ Resulting attribute.                              -- ./Util/GenerateHtmlCombinators.hs:261
xmlns = attribute " xmlns=\""                                                   -- ./Util/GenerateHtmlCombinators.hs:262
{-# INLINE xmlns #-}                                                            -- ./Util/GenerateHtmlCombinators.hs:263