module Halogen.HTML.Properties.ARIA where

import HPrelude
import Halogen.HTML.Core (AttrName (..))
import Halogen.HTML.Properties (IProp, attr)

activeDescendant :: forall r i. Text -> IProp r i
activeDescendant :: forall (r :: Row (*)) i. Text -> IProp r i
activeDescendant = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-activedescendant")

atomic :: forall r i. Text -> IProp r i
atomic :: forall (r :: Row (*)) i. Text -> IProp r i
atomic = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-atomic")

autoComplete :: forall r i. Text -> IProp r i
autoComplete :: forall (r :: Row (*)) i. Text -> IProp r i
autoComplete = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-autocomplete")

busy :: forall r i. Text -> IProp r i
busy :: forall (r :: Row (*)) i. Text -> IProp r i
busy = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-busy")

checked :: forall r i. Text -> IProp r i
checked :: forall (r :: Row (*)) i. Text -> IProp r i
checked = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-checked")

controls :: forall r i. Text -> IProp r i
controls :: forall (r :: Row (*)) i. Text -> IProp r i
controls = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-controls")

describedBy :: forall r i. Text -> IProp r i
describedBy :: forall (r :: Row (*)) i. Text -> IProp r i
describedBy = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-describedby")

disabled :: forall r i. Text -> IProp r i
disabled :: forall (r :: Row (*)) i. Text -> IProp r i
disabled = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-disabled")

dropEffect :: forall r i. Text -> IProp r i
dropEffect :: forall (r :: Row (*)) i. Text -> IProp r i
dropEffect = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-dropeffect")

expanded :: forall r i. Text -> IProp r i
expanded :: forall (r :: Row (*)) i. Text -> IProp r i
expanded = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-expanded")

flowTo :: forall r i. Text -> IProp r i
flowTo :: forall (r :: Row (*)) i. Text -> IProp r i
flowTo = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-flowto")

grabbed :: forall r i. Text -> IProp r i
grabbed :: forall (r :: Row (*)) i. Text -> IProp r i
grabbed = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-grabbed")

hasPopup :: forall r i. Text -> IProp r i
hasPopup :: forall (r :: Row (*)) i. Text -> IProp r i
hasPopup = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-haspopup")

hidden :: forall r i. Text -> IProp r i
hidden :: forall (r :: Row (*)) i. Text -> IProp r i
hidden = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-hidden")

invalid :: forall r i. Text -> IProp r i
invalid :: forall (r :: Row (*)) i. Text -> IProp r i
invalid = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-invalid")

label :: forall r i. Text -> IProp r i
label :: forall (r :: Row (*)) i. Text -> IProp r i
label = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-label")

labelledBy :: forall r i. Text -> IProp r i
labelledBy :: forall (r :: Row (*)) i. Text -> IProp r i
labelledBy = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-labelledby")

level :: forall r i. Text -> IProp r i
level :: forall (r :: Row (*)) i. Text -> IProp r i
level = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-level")

live :: forall r i. Text -> IProp r i
live :: forall (r :: Row (*)) i. Text -> IProp r i
live = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-live")

modal :: forall r i. Text -> IProp r i
modal :: forall (r :: Row (*)) i. Text -> IProp r i
modal = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-modal")

multiLine :: forall r i. Text -> IProp r i
multiLine :: forall (r :: Row (*)) i. Text -> IProp r i
multiLine = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-multiline")

multiSelectable :: forall r i. Text -> IProp r i
multiSelectable :: forall (r :: Row (*)) i. Text -> IProp r i
multiSelectable = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-multiselectable")

orientation :: forall r i. Text -> IProp r i
orientation :: forall (r :: Row (*)) i. Text -> IProp r i
orientation = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-orientation")

owns :: forall r i. Text -> IProp r i
owns :: forall (r :: Row (*)) i. Text -> IProp r i
owns = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-owns")

posInSet :: forall r i. Text -> IProp r i
posInSet :: forall (r :: Row (*)) i. Text -> IProp r i
posInSet = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-posinset")

pressed :: forall r i. Text -> IProp r i
pressed :: forall (r :: Row (*)) i. Text -> IProp r i
pressed = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-pressed")

readOnly :: forall r i. Text -> IProp r i
readOnly :: forall (r :: Row (*)) i. Text -> IProp r i
readOnly = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-readonly")

relevant :: forall r i. Text -> IProp r i
relevant :: forall (r :: Row (*)) i. Text -> IProp r i
relevant = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-relevant")

required :: forall r i. Text -> IProp r i
required :: forall (r :: Row (*)) i. Text -> IProp r i
required = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-required")

selected :: forall r i. Text -> IProp r i
selected :: forall (r :: Row (*)) i. Text -> IProp r i
selected = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-selected")

setSize :: forall r i. Text -> IProp r i
setSize :: forall (r :: Row (*)) i. Text -> IProp r i
setSize = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-setsize")

sort :: forall r i. Text -> IProp r i
sort :: forall (r :: Row (*)) i. Text -> IProp r i
sort = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-sort")

valueMax :: forall r i. Text -> IProp r i
valueMax :: forall (r :: Row (*)) i. Text -> IProp r i
valueMax = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-valuemax")

valueMin :: forall r i. Text -> IProp r i
valueMin :: forall (r :: Row (*)) i. Text -> IProp r i
valueMin = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-valuemin")

valueNow :: forall r i. Text -> IProp r i
valueNow :: forall (r :: Row (*)) i. Text -> IProp r i
valueNow = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-valuenow")

valueText :: forall r i. Text -> IProp r i
valueText :: forall (r :: Row (*)) i. Text -> IProp r i
valueText = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"aria-valuetext")

role :: forall r i. Text -> IProp r i
role :: forall (r :: Row (*)) i. Text -> IProp r i
role = AttrName -> Text -> IProp r i
forall (r :: Row (*)) msg. AttrName -> Text -> IProp r msg
attr (Text -> AttrName
AttrName Text
"role")