{-# LANGUAGE OverloadedStrings #-}

-- | Provides [ARIA](https://www.w3.org/TR/wai-aria-1.1/) attributes that can be
-- used to add accessibility annotations to Lucid templates. This module is
-- intended to be imported qualified, e.g., as @Aria@.
module Lucid.Aria where

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

-- | The @aria-busy@ attribute.
busy_ :: Text -> Attribute
busy_ :: Text -> Attribute
busy_ = Text -> Text -> Attribute
makeAttribute Text
"aria-busy"

-- | The @aria-checked@ attribute.
checked_ :: Text -> Attribute
checked_ :: Text -> Attribute
checked_ = Text -> Text -> Attribute
makeAttribute Text
"aria-checked"

-- | The @aria-disabled@ attribute.
disabled_ :: Text -> Attribute
disabled_ :: Text -> Attribute
disabled_ = Text -> Text -> Attribute
makeAttribute Text
"aria-disabled"

-- | The @aria-expanded@ attribute.
expanded_ :: Text -> Attribute
expanded_ :: Text -> Attribute
expanded_ = Text -> Text -> Attribute
makeAttribute Text
"aria-expanded"

-- | The @aria-grabbed@ attribute.
grabbed_ :: Text -> Attribute
grabbed_ :: Text -> Attribute
grabbed_ = Text -> Text -> Attribute
makeAttribute Text
"aria-grabbed"

-- | The @aria-hidden@ attribute.
hidden_ :: Text -> Attribute
hidden_ :: Text -> Attribute
hidden_ = Text -> Text -> Attribute
makeAttribute Text
"aria-hidden"

-- | The @aria-invalid@ attribute.
invalid_ :: Text -> Attribute
invalid_ :: Text -> Attribute
invalid_ = Text -> Text -> Attribute
makeAttribute Text
"aria-invalid"

-- | The @aria-pressed@ attribute.
pressed_ :: Text -> Attribute
pressed_ :: Text -> Attribute
pressed_ = Text -> Text -> Attribute
makeAttribute Text
"aria-pressed"

-- | The @aria-selected@ attribute.
selected_ :: Text -> Attribute
selected_ :: Text -> Attribute
selected_ = Text -> Text -> Attribute
makeAttribute Text
"aria-selected"

-- | The @aria-activedescendant@ attribute.
activedescendant_ :: Text -> Attribute
activedescendant_ :: Text -> Attribute
activedescendant_ = Text -> Text -> Attribute
makeAttribute Text
"aria-activedescendant"

-- | The @aria-atomic@ attribute.
atomic_ :: Text -> Attribute
atomic_ :: Text -> Attribute
atomic_ = Text -> Text -> Attribute
makeAttribute Text
"aria-atomic"

-- | The @aria-autocomplete@ attribute.
autocomplete_ :: Text -> Attribute
autocomplete_ :: Text -> Attribute
autocomplete_ = Text -> Text -> Attribute
makeAttribute Text
"aria-autocomplete"

-- | The @aria-controls@ attribute.
controls_ :: Text -> Attribute
controls_ :: Text -> Attribute
controls_ = Text -> Text -> Attribute
makeAttribute Text
"aria-controls"

-- | The @aria-describedby@ attribute.
describedby_ :: Text -> Attribute
describedby_ :: Text -> Attribute
describedby_ = Text -> Text -> Attribute
makeAttribute Text
"aria-describedby"

-- | The @aria-dropeffect@ attribute.
dropeffect_ :: Text -> Attribute
dropeffect_ :: Text -> Attribute
dropeffect_ = Text -> Text -> Attribute
makeAttribute Text
"aria-dropeffect"

-- | The @aria-flowto@ attribute.
flowto_ :: Text -> Attribute
flowto_ :: Text -> Attribute
flowto_ = Text -> Text -> Attribute
makeAttribute Text
"aria-flowto"

-- | The @aria-haspopup@ attribute.
haspopup_ :: Text -> Attribute
haspopup_ :: Text -> Attribute
haspopup_ = Text -> Text -> Attribute
makeAttribute Text
"aria-haspopup"

-- | The @aria-label@ attribute.
label_ :: Text -> Attribute
label_ :: Text -> Attribute
label_ = Text -> Text -> Attribute
makeAttribute Text
"aria-label"

-- | The @aria-labelledby@ attribute.
labelledby_ :: Text -> Attribute
labelledby_ :: Text -> Attribute
labelledby_ = Text -> Text -> Attribute
makeAttribute Text
"aria-labelledby"

-- | The @aria-level@ attribute.
level_ :: Text -> Attribute
level_ :: Text -> Attribute
level_ = Text -> Text -> Attribute
makeAttribute Text
"aria-level"

-- | The @aria-live@ attribute.
live_ :: Text -> Attribute
live_ :: Text -> Attribute
live_ = Text -> Text -> Attribute
makeAttribute Text
"aria-live"

-- | The @aria-multiline@ attribute.
multiline_ :: Text -> Attribute
multiline_ :: Text -> Attribute
multiline_ = Text -> Text -> Attribute
makeAttribute Text
"aria-multiline"

-- | The @aria-multiselectable@ attribute.
multiselectable_ :: Text -> Attribute
multiselectable_ :: Text -> Attribute
multiselectable_ = Text -> Text -> Attribute
makeAttribute Text
"aria-multiselectable"

-- | The @aria-orientation@ attribute.
orientation_ :: Text -> Attribute
orientation_ :: Text -> Attribute
orientation_ = Text -> Text -> Attribute
makeAttribute Text
"aria-orientation"

-- | The @aria-owns@ attribute.
owns_ :: Text -> Attribute
owns_ :: Text -> Attribute
owns_ = Text -> Text -> Attribute
makeAttribute Text
"aria-owns"

-- | The @aria-posinset@ attribute.
posinset_ :: Text -> Attribute
posinset_ :: Text -> Attribute
posinset_ = Text -> Text -> Attribute
makeAttribute Text
"aria-posinset"

-- | The @aria-readonly@ attribute.
readonly_ :: Text -> Attribute
readonly_ :: Text -> Attribute
readonly_ = Text -> Text -> Attribute
makeAttribute Text
"aria-readonly"

-- | The @aria-relevant@ attribute.
relevant_ :: Text -> Attribute
relevant_ :: Text -> Attribute
relevant_ = Text -> Text -> Attribute
makeAttribute Text
"aria-relevant"

-- | The @aria-required@ attribute.
required_ :: Text -> Attribute
required_ :: Text -> Attribute
required_ = Text -> Text -> Attribute
makeAttribute Text
"aria-required"

-- | The @aria-setsize@ attribute.
setsize_ :: Text -> Attribute
setsize_ :: Text -> Attribute
setsize_ = Text -> Text -> Attribute
makeAttribute Text
"aria-setsize"

-- | The @aria-sort@ attribute.
sort_ :: Text -> Attribute
sort_ :: Text -> Attribute
sort_ = Text -> Text -> Attribute
makeAttribute Text
"aria-sort"

-- | The @aria-valuemax@ attribute.
valuemax_ :: Text -> Attribute
valuemax_ :: Text -> Attribute
valuemax_ = Text -> Text -> Attribute
makeAttribute Text
"aria-valuemax"

-- | The @aria-valuemin@ attribute.
valuemin_ :: Text -> Attribute
valuemin_ :: Text -> Attribute
valuemin_ = Text -> Text -> Attribute
makeAttribute Text
"aria-valuemin"

-- | The @aria-valuenow@ attribute.
valuenow_ :: Text -> Attribute
valuenow_ :: Text -> Attribute
valuenow_ = Text -> Text -> Attribute
makeAttribute Text
"aria-valuenow"

-- | The @aria-valuetext@ attribute.
valuetext_ :: Text -> Attribute
valuetext_ :: Text -> Attribute
valuetext_ = Text -> Text -> Attribute
makeAttribute Text
"aria-valuetext"