{-# LANGUAGE OverloadedStrings #-}

module Lucid.Aria where

import Data.Text (Text)
import Lucid.Base (Attribute, makeAttribute)

busy_ :: Text -> Attribute
busy_ :: Text -> Attribute
busy_ = Text -> Text -> Attribute
makeAttribute Text
"aria-busy"

checked_ :: Text -> Attribute
checked_ :: Text -> Attribute
checked_ = Text -> Text -> Attribute
makeAttribute Text
"aria-checked"

disabled_ :: Text -> Attribute
disabled_ :: Text -> Attribute
disabled_ = Text -> Text -> Attribute
makeAttribute Text
"aria-disabled"

expanded_ :: Text -> Attribute
expanded_ :: Text -> Attribute
expanded_ = Text -> Text -> Attribute
makeAttribute Text
"aria-expanded"

grabbed_ :: Text -> Attribute
grabbed_ :: Text -> Attribute
grabbed_ = Text -> Text -> Attribute
makeAttribute Text
"aria-grabbed"

hidden_ :: Text -> Attribute
hidden_ :: Text -> Attribute
hidden_ = Text -> Text -> Attribute
makeAttribute Text
"aria-hidden"

invalid_ :: Text -> Attribute
invalid_ :: Text -> Attribute
invalid_ = Text -> Text -> Attribute
makeAttribute Text
"aria-invalid"

pressed_ :: Text -> Attribute
pressed_ :: Text -> Attribute
pressed_ = Text -> Text -> Attribute
makeAttribute Text
"aria-pressed"

selected_ :: Text -> Attribute
selected_ :: Text -> Attribute
selected_ = Text -> Text -> Attribute
makeAttribute Text
"aria-selected"

activedescendant_ :: Text -> Attribute
activedescendant_ :: Text -> Attribute
activedescendant_ = Text -> Text -> Attribute
makeAttribute Text
"aria-activedescendant"

atomic_ :: Text -> Attribute
atomic_ :: Text -> Attribute
atomic_ = Text -> Text -> Attribute
makeAttribute Text
"aria-atomic"

autocomplete_ :: Text -> Attribute
autocomplete_ :: Text -> Attribute
autocomplete_ = Text -> Text -> Attribute
makeAttribute Text
"aria-autocomplete"

controls_ :: Text -> Attribute
controls_ :: Text -> Attribute
controls_ = Text -> Text -> Attribute
makeAttribute Text
"aria-controls"

describedby_ :: Text -> Attribute
describedby_ :: Text -> Attribute
describedby_ = Text -> Text -> Attribute
makeAttribute Text
"aria-describedby"

dropeffect_ :: Text -> Attribute
dropeffect_ :: Text -> Attribute
dropeffect_ = Text -> Text -> Attribute
makeAttribute Text
"aria-dropeffect"

flowto_ :: Text -> Attribute
flowto_ :: Text -> Attribute
flowto_ = Text -> Text -> Attribute
makeAttribute Text
"aria-flowto"

haspopup_ :: Text -> Attribute
haspopup_ :: Text -> Attribute
haspopup_ = Text -> Text -> Attribute
makeAttribute Text
"aria-haspopup"

label_ :: Text -> Attribute
label_ :: Text -> Attribute
label_ = Text -> Text -> Attribute
makeAttribute Text
"aria-label"

labelledby_ :: Text -> Attribute
labelledby_ :: Text -> Attribute
labelledby_ = Text -> Text -> Attribute
makeAttribute Text
"aria-labelledby"

level_ :: Text -> Attribute
level_ :: Text -> Attribute
level_ = Text -> Text -> Attribute
makeAttribute Text
"aria-level"

live_ :: Text -> Attribute
live_ :: Text -> Attribute
live_ = Text -> Text -> Attribute
makeAttribute Text
"aria-live"

multiline_ :: Text -> Attribute
multiline_ :: Text -> Attribute
multiline_ = Text -> Text -> Attribute
makeAttribute Text
"aria-multiline"

multiselectable_ :: Text -> Attribute
multiselectable_ :: Text -> Attribute
multiselectable_ = Text -> Text -> Attribute
makeAttribute Text
"aria-multiselectable"

orientation_ :: Text -> Attribute
orientation_ :: Text -> Attribute
orientation_ = Text -> Text -> Attribute
makeAttribute Text
"aria-orientation"

owns_ :: Text -> Attribute
owns_ :: Text -> Attribute
owns_ = Text -> Text -> Attribute
makeAttribute Text
"aria-owns"

posinset_ :: Text -> Attribute
posinset_ :: Text -> Attribute
posinset_ = Text -> Text -> Attribute
makeAttribute Text
"aria-posinset"

readonly_ :: Text -> Attribute
readonly_ :: Text -> Attribute
readonly_ = Text -> Text -> Attribute
makeAttribute Text
"aria-readonly"

relevant_ :: Text -> Attribute
relevant_ :: Text -> Attribute
relevant_ = Text -> Text -> Attribute
makeAttribute Text
"aria-relevant"

required_ :: Text -> Attribute
required_ :: Text -> Attribute
required_ = Text -> Text -> Attribute
makeAttribute Text
"aria-required"

setsize_ :: Text -> Attribute
setsize_ :: Text -> Attribute
setsize_ = Text -> Text -> Attribute
makeAttribute Text
"aria-setsize"

sort_ :: Text -> Attribute
sort_ :: Text -> Attribute
sort_ = Text -> Text -> Attribute
makeAttribute Text
"aria-sort"

valuemax_ :: Text -> Attribute
valuemax_ :: Text -> Attribute
valuemax_ = Text -> Text -> Attribute
makeAttribute Text
"aria-valuemax"

valuemin_ :: Text -> Attribute
valuemin_ :: Text -> Attribute
valuemin_ = Text -> Text -> Attribute
makeAttribute Text
"aria-valuemin"

valuenow_ :: Text -> Attribute
valuenow_ :: Text -> Attribute
valuenow_ = Text -> Text -> Attribute
makeAttribute Text
"aria-valuenow"

valuetext_ :: Text -> Attribute
valuetext_ :: Text -> Attribute
valuetext_ = Text -> Text -> Attribute
makeAttribute Text
"aria-valuetext"