{-# OPTIONS_HADDOCK hide #-}

{-# LANGUAGE OverloadedStrings #-}

module Text.XHtml.Transitional.Attributes where

import Text.XHtml.Internals

-- * Extra attributes in XHTML Transitional

{-# DEPRECATED alink "This attribute is deprecated in XHTML 1.0" #-}
alink               :: LText -> HtmlAttr
alink :: Text -> HtmlAttr
alink               =   Builder -> Text -> HtmlAttr
strAttr Builder
"alink"

{-# DEPRECATED background "This attribute is deprecated in XHTML 1.0" #-}
background          :: LText -> HtmlAttr
background :: Text -> HtmlAttr
background          =   Builder -> Text -> HtmlAttr
strAttr Builder
"background"

{-# DEPRECATED bgcolor "This attribute is deprecated in XHTML 1.0" #-}
bgcolor             :: LText -> HtmlAttr
bgcolor :: Text -> HtmlAttr
bgcolor             =   Builder -> Text -> HtmlAttr
strAttr Builder
"bgcolor"

{-# DEPRECATED clear "This attribute is deprecated in XHTML 1.0" #-}
clear               :: LText -> HtmlAttr
clear :: Text -> HtmlAttr
clear               =   Builder -> Text -> HtmlAttr
strAttr Builder
"clear"

{-# DEPRECATED code "This attribute is deprecated in XHTML 1.0" #-}
code                :: LText -> HtmlAttr
code :: Text -> HtmlAttr
code                =   Builder -> Text -> HtmlAttr
strAttr Builder
"code"

{-# DEPRECATED color "This attribute is deprecated in XHTML 1.0" #-}
color               :: LText -> HtmlAttr
color :: Text -> HtmlAttr
color               =   Builder -> Text -> HtmlAttr
strAttr Builder
"color"

{-# DEPRECATED compact "This attribute is deprecated in XHTML 1.0" #-}
compact             ::           HtmlAttr
compact :: HtmlAttr
compact             = Builder -> HtmlAttr
emptyAttr Builder
"compact"

{-# DEPRECATED face "This attribute is deprecated in XHTML 1.0" #-}
face                :: LText -> HtmlAttr
face :: Text -> HtmlAttr
face                =   Builder -> Text -> HtmlAttr
strAttr Builder
"face"

{-# DEPRECATED hspace "This attribute is deprecated in XHTML 1.0" #-}
hspace              :: Int    -> HtmlAttr
hspace :: Int -> HtmlAttr
hspace              =   Builder -> Int -> HtmlAttr
intAttr Builder
"hspace"

{-# DEPRECATED link "This attribute is deprecated in XHTML 1.0" #-}
link                :: LText -> HtmlAttr
link :: Text -> HtmlAttr
link                =   Builder -> Text -> HtmlAttr
strAttr Builder
"link"

{-# DEPRECATED noshade "This attribute is deprecated in XHTML 1.0" #-}
noshade             ::           HtmlAttr
noshade :: HtmlAttr
noshade             = Builder -> HtmlAttr
emptyAttr Builder
"noshade"

{-# DEPRECATED nowrap "This attribute is deprecated in XHTML 1.0" #-}
nowrap              ::           HtmlAttr
nowrap :: HtmlAttr
nowrap              = Builder -> HtmlAttr
emptyAttr Builder
"nowrap"

{-# DEPRECATED start "This attribute is deprecated in XHTML 1.0" #-}
start               :: Int    -> HtmlAttr
start :: Int -> HtmlAttr
start               =   Builder -> Int -> HtmlAttr
intAttr Builder
"start"

target              :: LText -> HtmlAttr
target :: Text -> HtmlAttr
target              =   Builder -> Text -> HtmlAttr
strAttr Builder
"target"

{-# DEPRECATED text "This attribute is deprecated in XHTML 1.0" #-}
text                :: LText -> HtmlAttr
text :: Text -> HtmlAttr
text                =   Builder -> Text -> HtmlAttr
strAttr Builder
"text"

{-# DEPRECATED version "This attribute is deprecated in XHTML 1.0" #-}
version             :: LText -> HtmlAttr
version :: Text -> HtmlAttr
version             =   Builder -> Text -> HtmlAttr
strAttr Builder
"version"

{-# DEPRECATED vlink "This attribute is deprecated in XHTML 1.0" #-}
vlink               :: LText -> HtmlAttr
vlink :: Text -> HtmlAttr
vlink               =   Builder -> Text -> HtmlAttr
strAttr Builder
"vlink"

{-# DEPRECATED vspace "This attribute is deprecated in XHTML 1.0" #-}
vspace              :: Int    -> HtmlAttr
vspace :: Int -> HtmlAttr
vspace              =   Builder -> Int -> HtmlAttr
intAttr Builder
"vspace"



--
-- * Html colors
--

{-# DEPRECATED aqua,black,blue,fuchsia,gray,green,lime,maroon,navy,olive,purple,red,silver,teal,yellow,white "The use of color attibutes is deprecated in XHTML 1.0" #-}
aqua          :: LText
black         :: LText
blue          :: LText
fuchsia       :: LText
gray          :: LText
green         :: LText
lime          :: LText
maroon        :: LText
navy          :: LText
olive         :: LText
purple        :: LText
red           :: LText
silver        :: LText
teal          :: LText
yellow        :: LText
white         :: LText

aqua :: Text
aqua          = Text
"aqua"
black :: Text
black         = Text
"black"
blue :: Text
blue          = Text
"blue"
fuchsia :: Text
fuchsia       = Text
"fuchsia"
gray :: Text
gray          = Text
"gray"
green :: Text
green         = Text
"green"
lime :: Text
lime          = Text
"lime"
maroon :: Text
maroon        = Text
"maroon"
navy :: Text
navy          = Text
"navy"
olive :: Text
olive         = Text
"olive"
purple :: Text
purple        = Text
"purple"
red :: Text
red           = Text
"red"
silver :: Text
silver        = Text
"silver"
teal :: Text
teal          = Text
"teal"
yellow :: Text
yellow        = Text
"yellow"
white :: Text
white         = Text
"white"