-- 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.Html4.Strict.Attributes                                       -- Util/GenerateHtmlCombinators.hs:151
    ( abbr                                                                      -- Util/GenerateHtmlCombinators.hs:152
    , accept                                                                    -- Util/GenerateHtmlCombinators.hs:154
    , accesskey                                                                 -- Util/GenerateHtmlCombinators.hs:154
    , action                                                                    -- Util/GenerateHtmlCombinators.hs:154
    , align                                                                     -- Util/GenerateHtmlCombinators.hs:154
    , alt                                                                       -- Util/GenerateHtmlCombinators.hs:154
    , archive                                                                   -- Util/GenerateHtmlCombinators.hs:154
    , axis                                                                      -- Util/GenerateHtmlCombinators.hs:154
    , border                                                                    -- Util/GenerateHtmlCombinators.hs:154
    , cellpadding                                                               -- Util/GenerateHtmlCombinators.hs:154
    , cellspacing                                                               -- Util/GenerateHtmlCombinators.hs:154
    , char                                                                      -- Util/GenerateHtmlCombinators.hs:154
    , charoff                                                                   -- Util/GenerateHtmlCombinators.hs:154
    , charset                                                                   -- Util/GenerateHtmlCombinators.hs:154
    , checked                                                                   -- Util/GenerateHtmlCombinators.hs:154
    , cite                                                                      -- Util/GenerateHtmlCombinators.hs:154
    , class_                                                                    -- Util/GenerateHtmlCombinators.hs:154
    , classid                                                                   -- Util/GenerateHtmlCombinators.hs:154
    , codebase                                                                  -- Util/GenerateHtmlCombinators.hs:154
    , codetype                                                                  -- Util/GenerateHtmlCombinators.hs:154
    , cols                                                                      -- Util/GenerateHtmlCombinators.hs:154
    , colspan                                                                   -- Util/GenerateHtmlCombinators.hs:154
    , content                                                                   -- Util/GenerateHtmlCombinators.hs:154
    , coords                                                                    -- Util/GenerateHtmlCombinators.hs:154
    , data_                                                                     -- Util/GenerateHtmlCombinators.hs:154
    , datetime                                                                  -- Util/GenerateHtmlCombinators.hs:154
    , declare                                                                   -- Util/GenerateHtmlCombinators.hs:154
    , defer                                                                     -- Util/GenerateHtmlCombinators.hs:154
    , dir                                                                       -- Util/GenerateHtmlCombinators.hs:154
    , disabled                                                                  -- Util/GenerateHtmlCombinators.hs:154
    , enctype                                                                   -- Util/GenerateHtmlCombinators.hs:154
    , for                                                                       -- Util/GenerateHtmlCombinators.hs:154
    , frame                                                                     -- Util/GenerateHtmlCombinators.hs:154
    , headers                                                                   -- Util/GenerateHtmlCombinators.hs:154
    , height                                                                    -- Util/GenerateHtmlCombinators.hs:154
    , href                                                                      -- Util/GenerateHtmlCombinators.hs:154
    , hreflang                                                                  -- Util/GenerateHtmlCombinators.hs:154
    , http_equiv                                                                -- Util/GenerateHtmlCombinators.hs:154
    , id                                                                        -- Util/GenerateHtmlCombinators.hs:154
    , label                                                                     -- Util/GenerateHtmlCombinators.hs:154
    , lang                                                                      -- Util/GenerateHtmlCombinators.hs:154
    , maxlength                                                                 -- Util/GenerateHtmlCombinators.hs:154
    , media                                                                     -- Util/GenerateHtmlCombinators.hs:154
    , method                                                                    -- Util/GenerateHtmlCombinators.hs:154
    , multiple                                                                  -- Util/GenerateHtmlCombinators.hs:154
    , name                                                                      -- Util/GenerateHtmlCombinators.hs:154
    , nohref                                                                    -- Util/GenerateHtmlCombinators.hs:154
    , onabort                                                                   -- Util/GenerateHtmlCombinators.hs:154
    , onblur                                                                    -- Util/GenerateHtmlCombinators.hs:154
    , onchange                                                                  -- Util/GenerateHtmlCombinators.hs:154
    , onclick                                                                   -- Util/GenerateHtmlCombinators.hs:154
    , ondblclick                                                                -- Util/GenerateHtmlCombinators.hs:154
    , onfocus                                                                   -- Util/GenerateHtmlCombinators.hs:154
    , onkeydown                                                                 -- Util/GenerateHtmlCombinators.hs:154
    , onkeypress                                                                -- Util/GenerateHtmlCombinators.hs:154
    , onkeyup                                                                   -- Util/GenerateHtmlCombinators.hs:154
    , onload                                                                    -- 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
    , onreset                                                                   -- Util/GenerateHtmlCombinators.hs:154
    , onselect                                                                  -- Util/GenerateHtmlCombinators.hs:154
    , onsubmit                                                                  -- Util/GenerateHtmlCombinators.hs:154
    , onunload                                                                  -- Util/GenerateHtmlCombinators.hs:154
    , profile                                                                   -- Util/GenerateHtmlCombinators.hs:154
    , readonly                                                                  -- Util/GenerateHtmlCombinators.hs:154
    , rel                                                                       -- Util/GenerateHtmlCombinators.hs:154
    , rev                                                                       -- Util/GenerateHtmlCombinators.hs:154
    , rows                                                                      -- Util/GenerateHtmlCombinators.hs:154
    , rowspan                                                                   -- Util/GenerateHtmlCombinators.hs:154
    , rules                                                                     -- Util/GenerateHtmlCombinators.hs:154
    , scheme                                                                    -- Util/GenerateHtmlCombinators.hs:154
    , scope                                                                     -- Util/GenerateHtmlCombinators.hs:154
    , selected                                                                  -- Util/GenerateHtmlCombinators.hs:154
    , shape                                                                     -- Util/GenerateHtmlCombinators.hs:154
    , size                                                                      -- Util/GenerateHtmlCombinators.hs:154
    , span                                                                      -- Util/GenerateHtmlCombinators.hs:154
    , src                                                                       -- Util/GenerateHtmlCombinators.hs:154
    , standby                                                                   -- Util/GenerateHtmlCombinators.hs:154
    , style                                                                     -- Util/GenerateHtmlCombinators.hs:154
    , summary                                                                   -- Util/GenerateHtmlCombinators.hs:154
    , tabindex                                                                  -- Util/GenerateHtmlCombinators.hs:154
    , title                                                                     -- Util/GenerateHtmlCombinators.hs:154
    , type_                                                                     -- Util/GenerateHtmlCombinators.hs:154
    , usemap                                                                    -- Util/GenerateHtmlCombinators.hs:154
    , valign                                                                    -- Util/GenerateHtmlCombinators.hs:154
    , value                                                                     -- Util/GenerateHtmlCombinators.hs:154
    , valuetype                                                                 -- Util/GenerateHtmlCombinators.hs:154
    , width                                                                     -- 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 @abbr@ attribute.
--
-- Example:
--
-- > div ! abbr "bar" $ "Hello."
--
-- Result:
--
-- > <div abbr="bar">Hello.</div>
--
abbr :: AttributeValue  -- ^ Attribute value.                                   -- Util/GenerateHtmlCombinators.hs:260
     -> Attribute       -- ^ Resulting attribute.                               -- Util/GenerateHtmlCombinators.hs:261
abbr = attribute " abbr=\""                                                     -- Util/GenerateHtmlCombinators.hs:262
{-# INLINE abbr #-}                                                             -- Util/GenerateHtmlCombinators.hs:263

-- | 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 @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 @align@ attribute.
--
-- Example:
--
-- > div ! align "bar" $ "Hello."
--
-- Result:
--
-- > <div align="bar">Hello.</div>
--
align :: AttributeValue  -- ^ Attribute value.                                  -- Util/GenerateHtmlCombinators.hs:260
      -> Attribute       -- ^ Resulting attribute.                              -- Util/GenerateHtmlCombinators.hs:261
align = attribute " align=\""                                                   -- Util/GenerateHtmlCombinators.hs:262
{-# INLINE align #-}                                                            -- 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 @archive@ attribute.
--
-- Example:
--
-- > div ! archive "bar" $ "Hello."
--
-- Result:
--
-- > <div archive="bar">Hello.</div>
--
archive :: AttributeValue  -- ^ Attribute value.                                -- Util/GenerateHtmlCombinators.hs:260
        -> Attribute       -- ^ Resulting attribute.                            -- Util/GenerateHtmlCombinators.hs:261
archive = attribute " archive=\""                                               -- Util/GenerateHtmlCombinators.hs:262
{-# INLINE archive #-}                                                          -- Util/GenerateHtmlCombinators.hs:263

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

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

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

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

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

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

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

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

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

-- | Combinator for the @onblur@ attribute.
--
-- Example:
--
-- > div ! onblur "bar" $ "Hello."
--
-- Result:
--
-- > <div onblur="bar">Hello.</div>
--
onblur :: AttributeValue  -- ^ Attribute value.                                 -- Util/GenerateHtmlCombinators.hs:260
       -> Attribute       -- ^ Resulting attribute.                             -- Util/GenerateHtmlCombinators.hs:261
onblur = attribute " onblur=\""                                                 -- Util/GenerateHtmlCombinators.hs:262
{-# INLINE onblur #-}                                                           -- 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 @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 @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 @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 @onkeypress@ attribute.
--
-- Example:
--
-- > div ! onkeypress "bar" $ "Hello."
--
-- Result:
--
-- > <div onkeypress="bar">Hello.</div>
--
onkeypress :: AttributeValue  -- ^ Attribute value.                             -- Util/GenerateHtmlCombinators.hs:260
           -> Attribute       -- ^ Resulting attribute.                         -- Util/GenerateHtmlCombinators.hs:261
onkeypress = attribute " onkeypress=\""                                         -- Util/GenerateHtmlCombinators.hs:262
{-# INLINE onkeypress #-}                                                       -- 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 @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 @onreset@ attribute.
--
-- Example:
--
-- > div ! onreset "bar" $ "Hello."
--
-- Result:
--
-- > <div onreset="bar">Hello.</div>
--
onreset :: AttributeValue  -- ^ Attribute value.                                -- Util/GenerateHtmlCombinators.hs:260
        -> Attribute       -- ^ Resulting attribute.                            -- Util/GenerateHtmlCombinators.hs:261
onreset = attribute " onreset=\""                                               -- Util/GenerateHtmlCombinators.hs:262
{-# INLINE onreset #-}                                                          -- 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 @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 @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 @profile@ attribute.
--
-- Example:
--
-- > div ! profile "bar" $ "Hello."
--
-- Result:
--
-- > <div profile="bar">Hello.</div>
--
profile :: AttributeValue  -- ^ Attribute value.                                -- Util/GenerateHtmlCombinators.hs:260
        -> Attribute       -- ^ Resulting attribute.                            -- Util/GenerateHtmlCombinators.hs:261
profile = attribute " profile=\""                                               -- Util/GenerateHtmlCombinators.hs:262
{-# INLINE profile #-}                                                          -- 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 @rev@ attribute.
--
-- Example:
--
-- > div ! rev "bar" $ "Hello."
--
-- Result:
--
-- > <div rev="bar">Hello.</div>
--
rev :: AttributeValue  -- ^ Attribute value.                                    -- Util/GenerateHtmlCombinators.hs:260
    -> Attribute       -- ^ Resulting attribute.                                -- Util/GenerateHtmlCombinators.hs:261
rev = attribute " rev=\""                                                       -- Util/GenerateHtmlCombinators.hs:262
{-# INLINE rev #-}                                                              -- 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 @rules@ attribute.
--
-- Example:
--
-- > div ! rules "bar" $ "Hello."
--
-- Result:
--
-- > <div rules="bar">Hello.</div>
--
rules :: AttributeValue  -- ^ Attribute value.                                  -- Util/GenerateHtmlCombinators.hs:260
      -> Attribute       -- ^ Resulting attribute.                              -- Util/GenerateHtmlCombinators.hs:261
rules = attribute " rules=\""                                                   -- Util/GenerateHtmlCombinators.hs:262
{-# INLINE rules #-}                                                            -- Util/GenerateHtmlCombinators.hs:263

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