{-# OPTIONS_HADDOCK hide #-}

{-# LANGUAGE OverloadedStrings #-}

module Text.XHtml.Strict.Attributes where

import Text.XHtml.Internals
import qualified Data.Text.Lazy as LText

-- * Attributes in XHTML Strict

action              :: LText.Text -> HtmlAttr
align               :: LText.Text -> HtmlAttr
alt                 :: LText.Text -> HtmlAttr
altcode             :: LText.Text -> HtmlAttr
archive             :: LText.Text -> HtmlAttr
base                :: LText.Text -> HtmlAttr
border              :: Int    -> HtmlAttr
bordercolor         :: LText.Text -> HtmlAttr
cellpadding         :: Int    -> HtmlAttr
cellspacing         :: Int    -> HtmlAttr
checked             ::           HtmlAttr
codebase            :: LText.Text -> HtmlAttr
cols                :: LText.Text -> HtmlAttr
colspan             :: Int    -> HtmlAttr
content             :: LText.Text -> HtmlAttr
coords              :: LText.Text -> HtmlAttr
disabled            ::           HtmlAttr
enctype             :: LText.Text -> HtmlAttr
height              :: LText.Text -> HtmlAttr
href                :: LText.Text -> HtmlAttr
hreflang            :: LText.Text -> HtmlAttr
httpequiv           :: LText.Text -> HtmlAttr
identifier          :: LText.Text -> HtmlAttr
ismap               ::           HtmlAttr
lang                :: LText.Text -> HtmlAttr
maxlength           :: Int    -> HtmlAttr
method              :: LText.Text -> HtmlAttr
multiple            ::           HtmlAttr
name                :: LText.Text -> HtmlAttr
nohref              ::           HtmlAttr
rel                 :: LText.Text -> HtmlAttr
rev                 :: LText.Text -> HtmlAttr
rows                :: LText.Text -> HtmlAttr
rowspan             :: Int    -> HtmlAttr
rules               :: LText.Text -> HtmlAttr
selected            ::           HtmlAttr
shape               :: LText.Text -> HtmlAttr
size                :: LText.Text -> HtmlAttr
src                 :: LText.Text -> HtmlAttr
theclass            :: LText.Text -> HtmlAttr
thefor              :: LText.Text -> HtmlAttr
thestyle            :: LText.Text -> HtmlAttr
thetype             :: LText.Text -> HtmlAttr
title               :: LText.Text -> HtmlAttr
usemap              :: LText.Text -> HtmlAttr
valign              :: LText.Text -> HtmlAttr
value               :: LText.Text -> HtmlAttr
width               :: LText.Text -> HtmlAttr

action :: Text -> HtmlAttr
action              =   Builder -> Text -> HtmlAttr
strAttr Builder
"action"
align :: Text -> HtmlAttr
align               =   Builder -> Text -> HtmlAttr
strAttr Builder
"align"
alt :: Text -> HtmlAttr
alt                 =   Builder -> Text -> HtmlAttr
strAttr Builder
"alt"
altcode :: Text -> HtmlAttr
altcode             =   Builder -> Text -> HtmlAttr
strAttr Builder
"altcode"
archive :: Text -> HtmlAttr
archive             =   Builder -> Text -> HtmlAttr
strAttr Builder
"archive"
base :: Text -> HtmlAttr
base                =   Builder -> Text -> HtmlAttr
strAttr Builder
"base"
border :: Int -> HtmlAttr
border              =   Builder -> Int -> HtmlAttr
intAttr Builder
"border"
bordercolor :: Text -> HtmlAttr
bordercolor         =   Builder -> Text -> HtmlAttr
strAttr Builder
"bordercolor"
cellpadding :: Int -> HtmlAttr
cellpadding         =   Builder -> Int -> HtmlAttr
intAttr Builder
"cellpadding"
cellspacing :: Int -> HtmlAttr
cellspacing         =   Builder -> Int -> HtmlAttr
intAttr Builder
"cellspacing"
checked :: HtmlAttr
checked             = Builder -> HtmlAttr
emptyAttr Builder
"checked"
codebase :: Text -> HtmlAttr
codebase            =   Builder -> Text -> HtmlAttr
strAttr Builder
"codebase"
cols :: Text -> HtmlAttr
cols                =   Builder -> Text -> HtmlAttr
strAttr Builder
"cols"
colspan :: Int -> HtmlAttr
colspan             =   Builder -> Int -> HtmlAttr
intAttr Builder
"colspan"
content :: Text -> HtmlAttr
content             =   Builder -> Text -> HtmlAttr
strAttr Builder
"content"
coords :: Text -> HtmlAttr
coords              =   Builder -> Text -> HtmlAttr
strAttr Builder
"coords"
disabled :: HtmlAttr
disabled            = Builder -> HtmlAttr
emptyAttr Builder
"disabled"
enctype :: Text -> HtmlAttr
enctype             =   Builder -> Text -> HtmlAttr
strAttr Builder
"enctype"
height :: Text -> HtmlAttr
height              =   Builder -> Text -> HtmlAttr
strAttr Builder
"height"
href :: Text -> HtmlAttr
href                =   Builder -> Text -> HtmlAttr
strAttr Builder
"href"
hreflang :: Text -> HtmlAttr
hreflang            =   Builder -> Text -> HtmlAttr
strAttr Builder
"hreflang"
httpequiv :: Text -> HtmlAttr
httpequiv           =   Builder -> Text -> HtmlAttr
strAttr Builder
"http-equiv"
identifier :: Text -> HtmlAttr
identifier          =   Builder -> Text -> HtmlAttr
strAttr Builder
"id"
ismap :: HtmlAttr
ismap               = Builder -> HtmlAttr
emptyAttr Builder
"ismap"
lang :: Text -> HtmlAttr
lang                =   Builder -> Text -> HtmlAttr
strAttr Builder
"lang"
maxlength :: Int -> HtmlAttr
maxlength           =   Builder -> Int -> HtmlAttr
intAttr Builder
"maxlength"
method :: Text -> HtmlAttr
method              =   Builder -> Text -> HtmlAttr
strAttr Builder
"method"
multiple :: HtmlAttr
multiple            = Builder -> HtmlAttr
emptyAttr Builder
"multiple"
name :: Text -> HtmlAttr
name                =   Builder -> Text -> HtmlAttr
strAttr Builder
"name"
nohref :: HtmlAttr
nohref              = Builder -> HtmlAttr
emptyAttr Builder
"nohref"
rel :: Text -> HtmlAttr
rel                 =   Builder -> Text -> HtmlAttr
strAttr Builder
"rel"
rev :: Text -> HtmlAttr
rev                 =   Builder -> Text -> HtmlAttr
strAttr Builder
"rev"
rows :: Text -> HtmlAttr
rows                =   Builder -> Text -> HtmlAttr
strAttr Builder
"rows"
rowspan :: Int -> HtmlAttr
rowspan             =   Builder -> Int -> HtmlAttr
intAttr Builder
"rowspan"
rules :: Text -> HtmlAttr
rules               =   Builder -> Text -> HtmlAttr
strAttr Builder
"rules"
selected :: HtmlAttr
selected            = Builder -> HtmlAttr
emptyAttr Builder
"selected"
shape :: Text -> HtmlAttr
shape               =   Builder -> Text -> HtmlAttr
strAttr Builder
"shape"
size :: Text -> HtmlAttr
size                =   Builder -> Text -> HtmlAttr
strAttr Builder
"size"
src :: Text -> HtmlAttr
src                 =   Builder -> Text -> HtmlAttr
strAttr Builder
"src"
theclass :: Text -> HtmlAttr
theclass            =   Builder -> Text -> HtmlAttr
strAttr Builder
"class"
thefor :: Text -> HtmlAttr
thefor              =   Builder -> Text -> HtmlAttr
strAttr Builder
"for"
thestyle :: Text -> HtmlAttr
thestyle            =   Builder -> Text -> HtmlAttr
strAttr Builder
"style"
thetype :: Text -> HtmlAttr
thetype             =   Builder -> Text -> HtmlAttr
strAttr Builder
"type"
title :: Text -> HtmlAttr
title               =   Builder -> Text -> HtmlAttr
strAttr Builder
"title"
usemap :: Text -> HtmlAttr
usemap              =   Builder -> Text -> HtmlAttr
strAttr Builder
"usemap"
valign :: Text -> HtmlAttr
valign              =   Builder -> Text -> HtmlAttr
strAttr Builder
"valign"
value :: Text -> HtmlAttr
value               =   Builder -> Text -> HtmlAttr
strAttr Builder
"value"
width :: Text -> HtmlAttr
width               =   Builder -> Text -> HtmlAttr
strAttr Builder
"width"

{-# INLINE action      #-}
{-# INLINE align       #-}
{-# INLINE alt         #-}
{-# INLINE altcode     #-}
{-# INLINE archive     #-}
{-# INLINE base        #-}
{-# INLINE border      #-}
{-# INLINE bordercolor #-}
{-# INLINE cellpadding #-}
{-# INLINE cellspacing #-}
{-# INLINE checked     #-}
{-# INLINE codebase    #-}
{-# INLINE cols        #-}
{-# INLINE colspan     #-}
{-# INLINE content     #-}
{-# INLINE coords      #-}
{-# INLINE disabled    #-}
{-# INLINE enctype     #-}
{-# INLINE height      #-}
{-# INLINE href        #-}
{-# INLINE hreflang    #-}
{-# INLINE httpequiv   #-}
{-# INLINE identifier  #-}
{-# INLINE ismap       #-}
{-# INLINE lang        #-}
{-# INLINE maxlength   #-}
{-# INLINE method      #-}
{-# INLINE multiple    #-}
{-# INLINE name        #-}
{-# INLINE nohref      #-}
{-# INLINE rel         #-}
{-# INLINE rev         #-}
{-# INLINE rows        #-}
{-# INLINE rowspan     #-}
{-# INLINE rules       #-}
{-# INLINE selected    #-}
{-# INLINE shape       #-}
{-# INLINE size        #-}
{-# INLINE src         #-}
{-# INLINE theclass    #-}
{-# INLINE thefor      #-}
{-# INLINE thestyle    #-}
{-# INLINE thetype     #-}
{-# INLINE title       #-}
{-# INLINE usemap      #-}
{-# INLINE valign      #-}
{-# INLINE value       #-}
{-# INLINE width       #-}