{-# LANGUAGE OverloadedStrings #-} -- | This module exports combinators that provide you with the -- ability to set attributes on HTML elements. -- module Text.Blaze.Html4.Strict.Attributes ( abbr , accept , accesskey , action , align , alt , archive , axis , border , cellpadding , cellspacing , char , charoff , charset , checked , cite , class_ , classid , codebase , codetype , cols , colspan , content , coords , data_ , datetime , declare , defer , dir , disabled , for , frame , headers , height , href , hreflang , http_equiv , id , label , lang , maxlength , media , method , multiple , name , nohref , onabort , onblur , onchange , onclick , ondblclick , onfocus , onkeydown , onkeypress , onkeyup , onload , onmousedown , onmousemove , onmouseout , onmouseover , onmouseup , onreset , onselect , onsubmit , onunload , profile , readonly , rel , rev , rows , rowspan , rules , scheme , scope , selected , shape , size , span , src , standby , style , summary , tabindex , title , type_ , usemap , valign , value , valuetype , width ) where import Prelude () import Data.Text (Text) import Text.Blaze.Internal (Attribute, AttributeValue, attribute) -- | Combinator for the @abbr@ attribute. -- -- Example: -- -- > div
Hello.
-- abbr :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. abbr = attribute " abbr=\"" {-# INLINE abbr #-} -- | Combinator for the @accept@ attribute. -- -- Example: -- -- > div
Hello.
-- accept :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. accept = attribute " accept=\"" {-# INLINE accept #-} -- | Combinator for the @accesskey@ attribute. -- -- Example: -- -- > div
Hello.
-- accesskey :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. accesskey = attribute " accesskey=\"" {-# INLINE accesskey #-} -- | Combinator for the @action@ attribute. -- -- Example: -- -- > div
Hello.
-- action :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. action = attribute " action=\"" {-# INLINE action #-} -- | Combinator for the @align@ attribute. -- -- Example: -- -- > div
Hello.
-- align :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. align = attribute " align=\"" {-# INLINE align #-} -- | Combinator for the @alt@ attribute. -- -- Example: -- -- > div
Hello.
-- alt :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. alt = attribute " alt=\"" {-# INLINE alt #-} -- | Combinator for the @archive@ attribute. -- -- Example: -- -- > div
Hello.
-- archive :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. archive = attribute " archive=\"" {-# INLINE archive #-} -- | Combinator for the @axis@ attribute. -- -- Example: -- -- > div
Hello.
-- axis :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. axis = attribute " axis=\"" {-# INLINE axis #-} -- | Combinator for the @border@ attribute. -- -- Example: -- -- > div
Hello.
-- border :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. border = attribute " border=\"" {-# INLINE border #-} -- | Combinator for the @cellpadding@ attribute. -- -- Example: -- -- > div
Hello.
-- cellpadding :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. cellpadding = attribute " cellpadding=\"" {-# INLINE cellpadding #-} -- | Combinator for the @cellspacing@ attribute. -- -- Example: -- -- > div
Hello.
-- cellspacing :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. cellspacing = attribute " cellspacing=\"" {-# INLINE cellspacing #-} -- | Combinator for the @char@ attribute. -- -- Example: -- -- > div
Hello.
-- char :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. char = attribute " char=\"" {-# INLINE char #-} -- | Combinator for the @charoff@ attribute. -- -- Example: -- -- > div
Hello.
-- charoff :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. charoff = attribute " charoff=\"" {-# INLINE charoff #-} -- | Combinator for the @charset@ attribute. -- -- Example: -- -- > div
Hello.
-- charset :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. charset = attribute " charset=\"" {-# INLINE charset #-} -- | Combinator for the @checked@ attribute. -- -- Example: -- -- > div
Hello.
-- checked :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. checked = attribute " checked=\"" {-# INLINE checked #-} -- | Combinator for the @cite@ attribute. -- -- Example: -- -- > div
Hello.
-- cite :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. cite = attribute " cite=\"" {-# INLINE cite #-} -- | Combinator for the @class@ attribute. -- -- Example: -- -- > div
Hello.
-- class_ :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. class_ = attribute " class=\"" {-# INLINE class_ #-} -- | Combinator for the @classid@ attribute. -- -- Example: -- -- > div
Hello.
-- classid :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. classid = attribute " classid=\"" {-# INLINE classid #-} -- | Combinator for the @codebase@ attribute. -- -- Example: -- -- > div
Hello.
-- codebase :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. codebase = attribute " codebase=\"" {-# INLINE codebase #-} -- | Combinator for the @codetype@ attribute. -- -- Example: -- -- > div
Hello.
-- codetype :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. codetype = attribute " codetype=\"" {-# INLINE codetype #-} -- | Combinator for the @cols@ attribute. -- -- Example: -- -- > div
Hello.
-- cols :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. cols = attribute " cols=\"" {-# INLINE cols #-} -- | Combinator for the @colspan@ attribute. -- -- Example: -- -- > div
Hello.
-- colspan :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. colspan = attribute " colspan=\"" {-# INLINE colspan #-} -- | Combinator for the @content@ attribute. -- -- Example: -- -- > div
Hello.
-- content :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. content = attribute " content=\"" {-# INLINE content #-} -- | Combinator for the @coords@ attribute. -- -- Example: -- -- > div
Hello.
-- coords :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. coords = attribute " coords=\"" {-# INLINE coords #-} -- | Combinator for the @data@ attribute. -- -- Example: -- -- > div
Hello.
-- data_ :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. data_ = attribute " data=\"" {-# INLINE data_ #-} -- | Combinator for the @datetime@ attribute. -- -- Example: -- -- > div
Hello.
-- datetime :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. datetime = attribute " datetime=\"" {-# INLINE datetime #-} -- | Combinator for the @declare@ attribute. -- -- Example: -- -- > div
Hello.
-- declare :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. declare = attribute " declare=\"" {-# INLINE declare #-} -- | Combinator for the @defer@ attribute. -- -- Example: -- -- > div
Hello.
-- defer :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. defer = attribute " defer=\"" {-# INLINE defer #-} -- | Combinator for the @dir@ attribute. -- -- Example: -- -- > div
Hello.
-- dir :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. dir = attribute " dir=\"" {-# INLINE dir #-} -- | Combinator for the @disabled@ attribute. -- -- Example: -- -- > div
Hello.
-- disabled :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. disabled = attribute " disabled=\"" {-# INLINE disabled #-} -- | Combinator for the @for@ attribute. -- -- Example: -- -- > div
Hello.
-- for :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. for = attribute " for=\"" {-# INLINE for #-} -- | Combinator for the @frame@ attribute. -- -- Example: -- -- > div
Hello.
-- frame :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. frame = attribute " frame=\"" {-# INLINE frame #-} -- | Combinator for the @headers@ attribute. -- -- Example: -- -- > div
Hello.
-- headers :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. headers = attribute " headers=\"" {-# INLINE headers #-} -- | Combinator for the @height@ attribute. -- -- Example: -- -- > div
Hello.
-- height :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. height = attribute " height=\"" {-# INLINE height #-} -- | Combinator for the @href@ attribute. -- -- Example: -- -- > div
Hello.
-- href :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. href = attribute " href=\"" {-# INLINE href #-} -- | Combinator for the @hreflang@ attribute. -- -- Example: -- -- > div
Hello.
-- hreflang :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. hreflang = attribute " hreflang=\"" {-# INLINE hreflang #-} -- | Combinator for the @http-equiv@ attribute. -- -- Example: -- -- > div
Hello.
-- http_equiv :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. http_equiv = attribute " http-equiv=\"" {-# INLINE http_equiv #-} -- | Combinator for the @id@ attribute. -- -- Example: -- -- > div
Hello.
-- id :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. id = attribute " id=\"" {-# INLINE id #-} -- | Combinator for the @label@ attribute. -- -- Example: -- -- > div
Hello.
-- label :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. label = attribute " label=\"" {-# INLINE label #-} -- | Combinator for the @lang@ attribute. -- -- Example: -- -- > div
Hello.
-- lang :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. lang = attribute " lang=\"" {-# INLINE lang #-} -- | Combinator for the @maxlength@ attribute. -- -- Example: -- -- > div
Hello.
-- maxlength :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. maxlength = attribute " maxlength=\"" {-# INLINE maxlength #-} -- | Combinator for the @media@ attribute. -- -- Example: -- -- > div
Hello.
-- media :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. media = attribute " media=\"" {-# INLINE media #-} -- | Combinator for the @method@ attribute. -- -- Example: -- -- > div
Hello.
-- method :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. method = attribute " method=\"" {-# INLINE method #-} -- | Combinator for the @multiple@ attribute. -- -- Example: -- -- > div
Hello.
-- multiple :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. multiple = attribute " multiple=\"" {-# INLINE multiple #-} -- | Combinator for the @name@ attribute. -- -- Example: -- -- > div
Hello.
-- name :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. name = attribute " name=\"" {-# INLINE name #-} -- | Combinator for the @nohref@ attribute. -- -- Example: -- -- > div
Hello.
-- nohref :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. nohref = attribute " nohref=\"" {-# INLINE nohref #-} -- | Combinator for the @onabort@ attribute. -- -- Example: -- -- > div
Hello.
-- onabort :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. onabort = attribute " onabort=\"" {-# INLINE onabort #-} -- | Combinator for the @onblur@ attribute. -- -- Example: -- -- > div
Hello.
-- onblur :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. onblur = attribute " onblur=\"" {-# INLINE onblur #-} -- | Combinator for the @onchange@ attribute. -- -- Example: -- -- > div
Hello.
-- onchange :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. onchange = attribute " onchange=\"" {-# INLINE onchange #-} -- | Combinator for the @onclick@ attribute. -- -- Example: -- -- > div
Hello.
-- onclick :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. onclick = attribute " onclick=\"" {-# INLINE onclick #-} -- | Combinator for the @ondblclick@ attribute. -- -- Example: -- -- > div
Hello.
-- ondblclick :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. ondblclick = attribute " ondblclick=\"" {-# INLINE ondblclick #-} -- | Combinator for the @onfocus@ attribute. -- -- Example: -- -- > div
Hello.
-- onfocus :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. onfocus = attribute " onfocus=\"" {-# INLINE onfocus #-} -- | Combinator for the @onkeydown@ attribute. -- -- Example: -- -- > div
Hello.
-- onkeydown :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. onkeydown = attribute " onkeydown=\"" {-# INLINE onkeydown #-} -- | Combinator for the @onkeypress@ attribute. -- -- Example: -- -- > div
Hello.
-- onkeypress :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. onkeypress = attribute " onkeypress=\"" {-# INLINE onkeypress #-} -- | Combinator for the @onkeyup@ attribute. -- -- Example: -- -- > div
Hello.
-- onkeyup :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. onkeyup = attribute " onkeyup=\"" {-# INLINE onkeyup #-} -- | Combinator for the @onload@ attribute. -- -- Example: -- -- > div
Hello.
-- onload :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. onload = attribute " onload=\"" {-# INLINE onload #-} -- | Combinator for the @onmousedown@ attribute. -- -- Example: -- -- > div
Hello.
-- onmousedown :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. onmousedown = attribute " onmousedown=\"" {-# INLINE onmousedown #-} -- | Combinator for the @onmousemove@ attribute. -- -- Example: -- -- > div
Hello.
-- onmousemove :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. onmousemove = attribute " onmousemove=\"" {-# INLINE onmousemove #-} -- | Combinator for the @onmouseout@ attribute. -- -- Example: -- -- > div
Hello.
-- onmouseout :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. onmouseout = attribute " onmouseout=\"" {-# INLINE onmouseout #-} -- | Combinator for the @onmouseover@ attribute. -- -- Example: -- -- > div
Hello.
-- onmouseover :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. onmouseover = attribute " onmouseover=\"" {-# INLINE onmouseover #-} -- | Combinator for the @onmouseup@ attribute. -- -- Example: -- -- > div
Hello.
-- onmouseup :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. onmouseup = attribute " onmouseup=\"" {-# INLINE onmouseup #-} -- | Combinator for the @onreset@ attribute. -- -- Example: -- -- > div
Hello.
-- onreset :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. onreset = attribute " onreset=\"" {-# INLINE onreset #-} -- | Combinator for the @onselect@ attribute. -- -- Example: -- -- > div
Hello.
-- onselect :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. onselect = attribute " onselect=\"" {-# INLINE onselect #-} -- | Combinator for the @onsubmit@ attribute. -- -- Example: -- -- > div
Hello.
-- onsubmit :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. onsubmit = attribute " onsubmit=\"" {-# INLINE onsubmit #-} -- | Combinator for the @onunload@ attribute. -- -- Example: -- -- > div
Hello.
-- onunload :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. onunload = attribute " onunload=\"" {-# INLINE onunload #-} -- | Combinator for the @profile@ attribute. -- -- Example: -- -- > div
Hello.
-- profile :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. profile = attribute " profile=\"" {-# INLINE profile #-} -- | Combinator for the @readonly@ attribute. -- -- Example: -- -- > div
Hello.
-- readonly :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. readonly = attribute " readonly=\"" {-# INLINE readonly #-} -- | Combinator for the @rel@ attribute. -- -- Example: -- -- > div
Hello.
-- rel :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. rel = attribute " rel=\"" {-# INLINE rel #-} -- | Combinator for the @rev@ attribute. -- -- Example: -- -- > div
Hello.
-- rev :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. rev = attribute " rev=\"" {-# INLINE rev #-} -- | Combinator for the @rows@ attribute. -- -- Example: -- -- > div
Hello.
-- rows :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. rows = attribute " rows=\"" {-# INLINE rows #-} -- | Combinator for the @rowspan@ attribute. -- -- Example: -- -- > div
Hello.
-- rowspan :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. rowspan = attribute " rowspan=\"" {-# INLINE rowspan #-} -- | Combinator for the @rules@ attribute. -- -- Example: -- -- > div
Hello.
-- rules :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. rules = attribute " rules=\"" {-# INLINE rules #-} -- | Combinator for the @scheme@ attribute. -- -- Example: -- -- > div
Hello.
-- scheme :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. scheme = attribute " scheme=\"" {-# INLINE scheme #-} -- | Combinator for the @scope@ attribute. -- -- Example: -- -- > div
Hello.
-- scope :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. scope = attribute " scope=\"" {-# INLINE scope #-} -- | Combinator for the @selected@ attribute. -- -- Example: -- -- > div
Hello.
-- selected :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. selected = attribute " selected=\"" {-# INLINE selected #-} -- | Combinator for the @shape@ attribute. -- -- Example: -- -- > div
Hello.
-- shape :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. shape = attribute " shape=\"" {-# INLINE shape #-} -- | Combinator for the @size@ attribute. -- -- Example: -- -- > div
Hello.
-- size :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. size = attribute " size=\"" {-# INLINE size #-} -- | Combinator for the @span@ attribute. -- -- Example: -- -- > div
Hello.
-- span :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. span = attribute " span=\"" {-# INLINE span #-} -- | Combinator for the @src@ attribute. -- -- Example: -- -- > div
Hello.
-- src :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. src = attribute " src=\"" {-# INLINE src #-} -- | Combinator for the @standby@ attribute. -- -- Example: -- -- > div
Hello.
-- standby :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. standby = attribute " standby=\"" {-# INLINE standby #-} -- | Combinator for the @style@ attribute. -- -- Example: -- -- > div
Hello.
-- style :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. style = attribute " style=\"" {-# INLINE style #-} -- | Combinator for the @summary@ attribute. -- -- Example: -- -- > div
Hello.
-- summary :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. summary = attribute " summary=\"" {-# INLINE summary #-} -- | Combinator for the @tabindex@ attribute. -- -- Example: -- -- > div
Hello.
-- tabindex :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. tabindex = attribute " tabindex=\"" {-# INLINE tabindex #-} -- | Combinator for the @title@ attribute. -- -- Example: -- -- > div
Hello.
-- title :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. title = attribute " title=\"" {-# INLINE title #-} -- | Combinator for the @type@ attribute. -- -- Example: -- -- > div
Hello.
-- type_ :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. type_ = attribute " type=\"" {-# INLINE type_ #-} -- | Combinator for the @usemap@ attribute. -- -- Example: -- -- > div
Hello.
-- usemap :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. usemap = attribute " usemap=\"" {-# INLINE usemap #-} -- | Combinator for the @valign@ attribute. -- -- Example: -- -- > div
Hello.
-- valign :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. valign = attribute " valign=\"" {-# INLINE valign #-} -- | Combinator for the @value@ attribute. -- -- Example: -- -- > div
Hello.
-- value :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. value = attribute " value=\"" {-# INLINE value #-} -- | Combinator for the @valuetype@ attribute. -- -- Example: -- -- > div
Hello.
-- valuetype :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. valuetype = attribute " valuetype=\"" {-# INLINE valuetype #-} -- | Combinator for the @width@ attribute. -- -- Example: -- -- > div
Hello.
-- width :: AttributeValue -- ^ Attribute value. -> Attribute -- ^ Resulting attribute. width = attribute " width=\"" {-# INLINE width #-}