{-# OPTIONS_HADDOCK hide #-}

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               :: String -> HtmlAttr
alink :: String -> HtmlAttr
alink               =   String -> String -> HtmlAttr
strAttr String
"alink"

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

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

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

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

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

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

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

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

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

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

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

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

target              :: String -> HtmlAttr
target :: String -> HtmlAttr
target              =   String -> String -> HtmlAttr
strAttr String
"target"

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

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

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

{-# DEPRECATED vspace "This attribute is deprecated in XHTML 1.0" #-}
vspace              :: Int    -> HtmlAttr
vspace :: Int -> HtmlAttr
vspace              =   String -> Int -> HtmlAttr
intAttr String
"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          :: String
black         :: String
blue          :: String
fuchsia       :: String
gray          :: String
green         :: String
lime          :: String
maroon        :: String
navy          :: String
olive         :: String
purple        :: String
red           :: String
silver        :: String
teal          :: String
yellow        :: String
white         :: String

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