{-# LANGUAGE OverloadedStrings #-}

-- | Module    : Html.Events
-- Copyright   : (c) Joshua Obritsch, 2021
-- License     : MIT
-- Maintainer  : joshua@obritsch.com
-- Stability   : Experimental
--
-- The "Html.Events" module provides a set of functions for generating HTML event handlers.
module Html.Events
    ( -- * Event Handlers
      -- ** onauxclick
      onauxclick
      -- ** onafterprint
    , onafterprint
      -- ** onbeforematch
    , onbeforematch
      -- ** onbeforeprint
    , onbeforeprint
      -- ** onbeforeunload
    , onbeforeunload
      -- ** onblur
    , onblur
      -- ** oncancel
    , oncancel
      -- ** oncanplay
    , oncanplay
      -- ** oncanplaythrough
    , oncanplaythrough
      -- ** onchange
    , onchange
      -- ** onclick
    , onclick
      -- ** onclose
    , onclose
      -- ** oncontextlost
    , oncontextlost
      -- ** oncontextmenu
    , oncontextmenu
      -- ** oncontextrestored
    , oncontextrestored
      -- ** oncopy
    , oncopy
      -- ** oncuechange
    , oncuechange
      -- ** oncut
    , oncut
      -- ** ondblclick
    , ondblclick
      -- ** ondrag
    , ondrag
      -- ** ondragend
    , ondragend
      -- ** ondragenter
    , ondragenter
      -- ** ondragleave
    , ondragleave
      -- ** ondragover
    , ondragover
      -- ** ondragstart
    , ondragstart
      -- ** ondrop
    , ondrop
      -- ** ondurationchange
    , ondurationchange
      -- ** onemptied
    , onemptied
      -- ** onended
    , onended
      -- ** onerror
    , onerror
      -- ** onfocus
    , onfocus
      -- ** onformdata
    , onformdata
      -- ** onhashchange
    , onhashchange
      -- ** oninput
    , oninput
      -- ** oninvalid
    , oninvalid
      -- ** onkeydown
    , onkeydown
      -- ** onkeypress
    , onkeypress
      -- ** onkeyup
    , onkeyup
      -- ** onlanguagechange
    , onlanguagechange
      -- ** onload
    , onload
      -- ** onloadeddata
    , onloadeddata
      -- ** onloadedmetadata
    , onloadedmetadata
      -- ** onloadstart
    , onloadstart
      -- ** onmessage
    , onmessage
      -- ** onmessageerror
    , onmessageerror
      -- ** onmousedown
    , onmousedown
      -- ** onmouseenter
    , onmouseenter
      -- ** onmouseleave
    , onmouseleave
      -- ** onmousemove
    , onmousemove
      -- ** onmouseout
    , onmouseout
      -- ** onmouseover
    , onmouseover
      -- ** onmouseup
    , onmouseup
      -- ** onoffline
    , onoffline
      -- ** ononline
    , ononline
      -- ** onpagehide
    , onpagehide
      -- ** onpageshow
    , onpageshow
      -- ** onpaste
    , onpaste
      -- ** onpause
    , onpause
      -- ** onplay
    , onplay
      -- ** onplaying
    , onplaying
      -- ** onpopstate
    , onpopstate
      -- ** onprogress
    , onprogress
      -- ** onratechange
    , onratechange
      -- ** onreset
    , onreset
      -- ** onresize
    , onresize
      -- ** onrejectionhandled
    , onrejectionhandled
      -- ** onscroll
    , onscroll
      -- ** onsecuritypolicyviolation
    , onsecuritypolicyviolation
      -- ** onseeked
    , onseeked
      -- ** onseeking
    , onseeking
      -- ** onselect
    , onselect
      -- ** onslotchange
    , onslotchange
      -- ** onstalled
    , onstalled
      -- ** onstorage
    , onstorage
      -- ** onsubmit
    , onsubmit
      -- ** onsuspend
    , onsuspend
      -- ** ontimeupdate
    , ontimeupdate
      -- ** ontoggle
    , ontoggle
      -- ** onunhandledrejection
    , onunhandledrejection
      -- ** onunload
    , onunload
      -- ** onvolumechange
    , onvolumechange
      -- ** onwaiting
    , onwaiting
      -- ** onwheel
    , onwheel
    ) where


import Data.Text.Lazy.Builder (Builder)
import Html (Attribute(..))


-- EVENT HANDLERS


-- | Generates an HTML @onauxclick@ event handler with the given value.
onauxclick :: Builder -> Attribute
onauxclick :: Builder -> Attribute
onauxclick = Builder -> Builder -> Attribute
TextAttribute Builder
" onauxclick=\""
{-# INLINE onauxclick #-}


-- | Generates an HTML @onafterprint@ event handler with the given value.
onafterprint :: Builder -> Attribute
onafterprint :: Builder -> Attribute
onafterprint = Builder -> Builder -> Attribute
TextAttribute Builder
" onafterprint=\""
{-# INLINE onafterprint #-}


-- | Generates an HTML @onbeforematch@ event handler with the given value.
onbeforematch :: Builder -> Attribute
onbeforematch :: Builder -> Attribute
onbeforematch = Builder -> Builder -> Attribute
TextAttribute Builder
" onbeforematch=\""
{-# INLINE onbeforematch #-}


-- | Generates an HTML @onbeforeprint@ event handler with the given value.
onbeforeprint :: Builder -> Attribute
onbeforeprint :: Builder -> Attribute
onbeforeprint = Builder -> Builder -> Attribute
TextAttribute Builder
" onbeforeprint=\""
{-# INLINE onbeforeprint #-}


-- | Generates an HTML @onbeforeunload@ event handler with the given value.
onbeforeunload :: Builder -> Attribute
onbeforeunload :: Builder -> Attribute
onbeforeunload = Builder -> Builder -> Attribute
TextAttribute Builder
" onbeforeunload=\""
{-# INLINE onbeforeunload #-}


-- | Generates an HTML @onblur@ event handler with the given value.
onblur :: Builder -> Attribute
onblur :: Builder -> Attribute
onblur = Builder -> Builder -> Attribute
TextAttribute Builder
" onblur=\""
{-# INLINE onblur #-}


-- | Generates an HTML @oncancel@ event handler with the given value.
oncancel :: Builder -> Attribute
oncancel :: Builder -> Attribute
oncancel = Builder -> Builder -> Attribute
TextAttribute Builder
" oncancel=\""
{-# INLINE oncancel #-}


-- | Generates an HTML @oncanplay@ event handler with the given value.
oncanplay :: Builder -> Attribute
oncanplay :: Builder -> Attribute
oncanplay = Builder -> Builder -> Attribute
TextAttribute Builder
" oncanplay=\""
{-# INLINE oncanplay #-}


-- | Generates an HTML @oncanplaythrough@ event handler with the given value.
oncanplaythrough :: Builder -> Attribute
oncanplaythrough :: Builder -> Attribute
oncanplaythrough = Builder -> Builder -> Attribute
TextAttribute Builder
" oncanplaythrough=\""
{-# INLINE oncanplaythrough #-}


-- | Generates an HTML @onchange@ event handler with the given value.
onchange :: Builder -> Attribute
onchange :: Builder -> Attribute
onchange = Builder -> Builder -> Attribute
TextAttribute Builder
" onchange=\""
{-# INLINE onchange #-}


-- | Generates an HTML @onclick@ event handler with the given value.
onclick :: Builder -> Attribute
onclick :: Builder -> Attribute
onclick = Builder -> Builder -> Attribute
TextAttribute Builder
" onclick=\""
{-# INLINE onclick #-}


-- | Generates an HTML @onclose@ event handler with the given value.
onclose :: Builder -> Attribute
onclose :: Builder -> Attribute
onclose = Builder -> Builder -> Attribute
TextAttribute Builder
" onclose=\""
{-# INLINE onclose #-}


-- | Generates an HTML @oncontextlost@ event handler with the given value.
oncontextlost :: Builder -> Attribute
oncontextlost :: Builder -> Attribute
oncontextlost = Builder -> Builder -> Attribute
TextAttribute Builder
" oncontextlost=\""
{-# INLINE oncontextlost #-}


-- | Generates an HTML @oncontextmenu@ event handler with the given value.
oncontextmenu :: Builder -> Attribute
oncontextmenu :: Builder -> Attribute
oncontextmenu = Builder -> Builder -> Attribute
TextAttribute Builder
" oncontextmenu=\""
{-# INLINE oncontextmenu #-}


-- | Generates an HTML @oncontextrestored@ event handler with the given value.
oncontextrestored :: Builder -> Attribute
oncontextrestored :: Builder -> Attribute
oncontextrestored = Builder -> Builder -> Attribute
TextAttribute Builder
" oncontextrestored=\""
{-# INLINE oncontextrestored #-}


-- | Generates an HTML @oncopy@ event handler with the given value.
oncopy :: Builder -> Attribute
oncopy :: Builder -> Attribute
oncopy = Builder -> Builder -> Attribute
TextAttribute Builder
" oncopy=\""
{-# INLINE oncopy #-}


-- | Generates an HTML @oncuechange@ event handler with the given value.
oncuechange :: Builder -> Attribute
oncuechange :: Builder -> Attribute
oncuechange = Builder -> Builder -> Attribute
TextAttribute Builder
" oncuechange=\""
{-# INLINE oncuechange #-}


-- | Generates an HTML @oncut@ event handler with the given value.
oncut :: Builder -> Attribute
oncut :: Builder -> Attribute
oncut = Builder -> Builder -> Attribute
TextAttribute Builder
" oncut=\""
{-# INLINE oncut #-}


-- | Generates an HTML @ondblclick@ event handler with the given value.
ondblclick :: Builder -> Attribute
ondblclick :: Builder -> Attribute
ondblclick = Builder -> Builder -> Attribute
TextAttribute Builder
" ondblclick=\""
{-# INLINE ondblclick #-}


-- | Generates an HTML @ondrag@ event handler with the given value.
ondrag :: Builder -> Attribute
ondrag :: Builder -> Attribute
ondrag = Builder -> Builder -> Attribute
TextAttribute Builder
" ondrag=\""
{-# INLINE ondrag #-}


-- | Generates an HTML @ondragend@ event handler with the given value.
ondragend :: Builder -> Attribute
ondragend :: Builder -> Attribute
ondragend = Builder -> Builder -> Attribute
TextAttribute Builder
" ondragend=\""
{-# INLINE ondragend #-}


-- | Generates an HTML @ondragenter@ event handler with the given value.
ondragenter :: Builder -> Attribute
ondragenter :: Builder -> Attribute
ondragenter = Builder -> Builder -> Attribute
TextAttribute Builder
" ondragenter=\""
{-# INLINE ondragenter #-}


-- | Generates an HTML @ondragleave@ event handler with the given value.
ondragleave :: Builder -> Attribute
ondragleave :: Builder -> Attribute
ondragleave = Builder -> Builder -> Attribute
TextAttribute Builder
" ondragleave=\""
{-# INLINE ondragleave #-}


-- | Generates an HTML @ondragover@ event handler with the given value.
ondragover :: Builder -> Attribute
ondragover :: Builder -> Attribute
ondragover = Builder -> Builder -> Attribute
TextAttribute Builder
" ondragover=\""
{-# INLINE ondragover #-}


-- | Generates an HTML @ondragstart@ event handler with the given value.
ondragstart :: Builder -> Attribute
ondragstart :: Builder -> Attribute
ondragstart = Builder -> Builder -> Attribute
TextAttribute Builder
" ondragstart=\""
{-# INLINE ondragstart #-}


-- | Generates an HTML @ondrop@ event handler with the given value.
ondrop :: Builder -> Attribute
ondrop :: Builder -> Attribute
ondrop = Builder -> Builder -> Attribute
TextAttribute Builder
" ondrop=\""
{-# INLINE ondrop #-}


-- | Generates an HTML @ondurationchange@ event handler with the given value.
ondurationchange :: Builder -> Attribute
ondurationchange :: Builder -> Attribute
ondurationchange = Builder -> Builder -> Attribute
TextAttribute Builder
" ondurationchange=\""
{-# INLINE ondurationchange #-}


-- | Generates an HTML @onemptied@ event handler with the given value.
onemptied :: Builder -> Attribute
onemptied :: Builder -> Attribute
onemptied = Builder -> Builder -> Attribute
TextAttribute Builder
" onemptied=\""
{-# INLINE onemptied #-}


-- | Generates an HTML @onended@ event handler with the given value.
onended :: Builder -> Attribute
onended :: Builder -> Attribute
onended = Builder -> Builder -> Attribute
TextAttribute Builder
" onended=\""
{-# INLINE onended #-}


-- | Generates an HTML @onerror@ event handler with the given value.
onerror :: Builder -> Attribute
onerror :: Builder -> Attribute
onerror = Builder -> Builder -> Attribute
TextAttribute Builder
" onerror=\""
{-# INLINE onerror #-}


-- | Generates an HTML @onfocus@ event handler with the given value.
onfocus :: Builder -> Attribute
onfocus :: Builder -> Attribute
onfocus = Builder -> Builder -> Attribute
TextAttribute Builder
" onfocus=\""
{-# INLINE onfocus #-}


-- | Generates an HTML @onformdata@ event handler with the given value.
onformdata :: Builder -> Attribute
onformdata :: Builder -> Attribute
onformdata = Builder -> Builder -> Attribute
TextAttribute Builder
" onformdata=\""
{-# INLINE onformdata #-}


-- | Generates an HTML @onhashchange@ event handler with the given value.
onhashchange :: Builder -> Attribute
onhashchange :: Builder -> Attribute
onhashchange = Builder -> Builder -> Attribute
TextAttribute Builder
" onhashchange=\""
{-# INLINE onhashchange #-}


-- | Generates an HTML @oninput@ event handler with the given value.
oninput :: Builder -> Attribute
oninput :: Builder -> Attribute
oninput = Builder -> Builder -> Attribute
TextAttribute Builder
" oninput=\""
{-# INLINE oninput #-}


-- | Generates an HTML @oninvalid@ event handler with the given value.
oninvalid :: Builder -> Attribute
oninvalid :: Builder -> Attribute
oninvalid = Builder -> Builder -> Attribute
TextAttribute Builder
" oninvalid=\""
{-# INLINE oninvalid #-}


-- | Generates an HTML @onkeydown@ event handler with the given value.
onkeydown :: Builder -> Attribute
onkeydown :: Builder -> Attribute
onkeydown = Builder -> Builder -> Attribute
TextAttribute Builder
" onkeydown=\""
{-# INLINE onkeydown #-}


-- | Generates an HTML @onkeypress@ event handler with the given value.
onkeypress :: Builder -> Attribute
onkeypress :: Builder -> Attribute
onkeypress = Builder -> Builder -> Attribute
TextAttribute Builder
" onkeypress=\""
{-# INLINE onkeypress #-}


-- | Generates an HTML @onkeyup@ event handler with the given value.
onkeyup :: Builder -> Attribute
onkeyup :: Builder -> Attribute
onkeyup = Builder -> Builder -> Attribute
TextAttribute Builder
" onkeyup=\""
{-# INLINE onkeyup #-}


-- | Generates an HTML @onlanguagechange@ event handler with the given value.
onlanguagechange :: Builder -> Attribute
onlanguagechange :: Builder -> Attribute
onlanguagechange = Builder -> Builder -> Attribute
TextAttribute Builder
" onlanguagechange=\""
{-# INLINE onlanguagechange #-}


-- | Generates an HTML @onload@ event handler with the given value.
onload :: Builder -> Attribute
onload :: Builder -> Attribute
onload = Builder -> Builder -> Attribute
TextAttribute Builder
" onload=\""
{-# INLINE onload #-}


-- | Generates an HTML @onloadeddata@ event handler with the given value.
onloadeddata :: Builder -> Attribute
onloadeddata :: Builder -> Attribute
onloadeddata = Builder -> Builder -> Attribute
TextAttribute Builder
" onloadeddata=\""
{-# INLINE onloadeddata #-}


-- | Generates an HTML @onloadedmetadata@ event handler with the given value.
onloadedmetadata :: Builder -> Attribute
onloadedmetadata :: Builder -> Attribute
onloadedmetadata = Builder -> Builder -> Attribute
TextAttribute Builder
" onloadedmetadata=\""
{-# INLINE onloadedmetadata #-}


-- | Generates an HTML @onloadstart@ event handler with the given value.
onloadstart :: Builder -> Attribute
onloadstart :: Builder -> Attribute
onloadstart = Builder -> Builder -> Attribute
TextAttribute Builder
" onloadstart=\""
{-# INLINE onloadstart #-}


-- | Generates an HTML @onmessage@ event handler with the given value.
onmessage :: Builder -> Attribute
onmessage :: Builder -> Attribute
onmessage = Builder -> Builder -> Attribute
TextAttribute Builder
" onmessage=\""
{-# INLINE onmessage #-}


-- | Generates an HTML @onmessageerror@ event handler with the given value.
onmessageerror :: Builder -> Attribute
onmessageerror :: Builder -> Attribute
onmessageerror = Builder -> Builder -> Attribute
TextAttribute Builder
" onmessageerror=\""
{-# INLINE onmessageerror #-}


-- | Generates an HTML @onmousedown@ event handler with the given value.
onmousedown :: Builder -> Attribute
onmousedown :: Builder -> Attribute
onmousedown = Builder -> Builder -> Attribute
TextAttribute Builder
" onmousedown=\""
{-# INLINE onmousedown #-}


-- | Generates an HTML @onmouseenter@ event handler with the given value.
onmouseenter :: Builder -> Attribute
onmouseenter :: Builder -> Attribute
onmouseenter = Builder -> Builder -> Attribute
TextAttribute Builder
" onmouseenter=\""
{-# INLINE onmouseenter #-}


-- | Generates an HTML @onmouseleave@ event handler with the given value.
onmouseleave :: Builder -> Attribute
onmouseleave :: Builder -> Attribute
onmouseleave = Builder -> Builder -> Attribute
TextAttribute Builder
" onmouseleave=\""
{-# INLINE onmouseleave #-}


-- | Generates an HTML @onmousemove@ event handler with the given value.
onmousemove :: Builder -> Attribute
onmousemove :: Builder -> Attribute
onmousemove = Builder -> Builder -> Attribute
TextAttribute Builder
" onmousemove=\""
{-# INLINE onmousemove #-}


-- | Generates an HTML @onmouseout@ event handler with the given value.
onmouseout :: Builder -> Attribute
onmouseout :: Builder -> Attribute
onmouseout = Builder -> Builder -> Attribute
TextAttribute Builder
" onmouseout=\""
{-# INLINE onmouseout #-}


-- | Generates an HTML @onmouseover@ event handler with the given value.
onmouseover :: Builder -> Attribute
onmouseover :: Builder -> Attribute
onmouseover = Builder -> Builder -> Attribute
TextAttribute Builder
" onmouseover=\""
{-# INLINE onmouseover #-}


-- | Generates an HTML @onmouseup@ event handler with the given value.
onmouseup :: Builder -> Attribute
onmouseup :: Builder -> Attribute
onmouseup = Builder -> Builder -> Attribute
TextAttribute Builder
" onmouseup=\""
{-# INLINE onmouseup #-}


-- | Generates an HTML @onoffline@ event handler with the given value.
onoffline :: Builder -> Attribute
onoffline :: Builder -> Attribute
onoffline = Builder -> Builder -> Attribute
TextAttribute Builder
" onoffline=\""
{-# INLINE onoffline #-}


-- | Generates an HTML @ononline@ event handler with the given value.
ononline :: Builder -> Attribute
ononline :: Builder -> Attribute
ononline = Builder -> Builder -> Attribute
TextAttribute Builder
" ononline=\""
{-# INLINE ononline #-}


-- | Generates an HTML @onpagehide@ event handler with the given value.
onpagehide :: Builder -> Attribute
onpagehide :: Builder -> Attribute
onpagehide = Builder -> Builder -> Attribute
TextAttribute Builder
" onpagehide=\""
{-# INLINE onpagehide #-}


-- | Generates an HTML @onpageshow@ event handler with the given value.
onpageshow :: Builder -> Attribute
onpageshow :: Builder -> Attribute
onpageshow = Builder -> Builder -> Attribute
TextAttribute Builder
" onpageshow=\""
{-# INLINE onpageshow #-}


-- | Generates an HTML @onpaste@ event handler with the given value.
onpaste :: Builder -> Attribute
onpaste :: Builder -> Attribute
onpaste = Builder -> Builder -> Attribute
TextAttribute Builder
" onpaste=\""
{-# INLINE onpaste #-}


-- | Generates an HTML @onpause@ event handler with the given value.
onpause :: Builder -> Attribute
onpause :: Builder -> Attribute
onpause = Builder -> Builder -> Attribute
TextAttribute Builder
" onpause=\""
{-# INLINE onpause #-}


-- | Generates an HTML @onplay@ event handler with the given value.
onplay :: Builder -> Attribute
onplay :: Builder -> Attribute
onplay = Builder -> Builder -> Attribute
TextAttribute Builder
" onplay=\""
{-# INLINE onplay #-}


-- | Generates an HTML @onplaying@ event handler with the given value.
onplaying :: Builder -> Attribute
onplaying :: Builder -> Attribute
onplaying = Builder -> Builder -> Attribute
TextAttribute Builder
" onplaying=\""
{-# INLINE onplaying #-}


-- | Generates an HTML @onpopstate@ event handler with the given value.
onpopstate :: Builder -> Attribute
onpopstate :: Builder -> Attribute
onpopstate = Builder -> Builder -> Attribute
TextAttribute Builder
" onpopstate=\""
{-# INLINE onpopstate #-}


-- | Generates an HTML @onprogress@ event handler with the given value.
onprogress :: Builder -> Attribute
onprogress :: Builder -> Attribute
onprogress = Builder -> Builder -> Attribute
TextAttribute Builder
" onprogress=\""
{-# INLINE onprogress #-}


-- | Generates an HTML @onratechange@ event handler with the given value.
onratechange :: Builder -> Attribute
onratechange :: Builder -> Attribute
onratechange = Builder -> Builder -> Attribute
TextAttribute Builder
" onratechange=\""
{-# INLINE onratechange #-}


-- | Generates an HTML @onreset@ event handler with the given value.
onreset :: Builder -> Attribute
onreset :: Builder -> Attribute
onreset = Builder -> Builder -> Attribute
TextAttribute Builder
" onreset=\""
{-# INLINE onreset #-}


-- | Generates an HTML @onresize@ event handler with the given value.
onresize :: Builder -> Attribute
onresize :: Builder -> Attribute
onresize = Builder -> Builder -> Attribute
TextAttribute Builder
" onresize=\""
{-# INLINE onresize #-}


-- | Generates an HTML @onrejectionhandled@ event handler with the given value.
onrejectionhandled :: Builder -> Attribute
onrejectionhandled :: Builder -> Attribute
onrejectionhandled = Builder -> Builder -> Attribute
TextAttribute Builder
" onrejectionhandled=\""
{-# INLINE onrejectionhandled #-}


-- | Generates an HTML @onscroll@ event handler with the given value.
onscroll :: Builder -> Attribute
onscroll :: Builder -> Attribute
onscroll = Builder -> Builder -> Attribute
TextAttribute Builder
" onscroll=\""
{-# INLINE onscroll #-}


-- | Generates an HTML @onsecuritypolicyviolation@ event handler with the given value.
onsecuritypolicyviolation :: Builder -> Attribute
onsecuritypolicyviolation :: Builder -> Attribute
onsecuritypolicyviolation = Builder -> Builder -> Attribute
TextAttribute Builder
" onsecuritypolicyviolation=\""
{-# INLINE onsecuritypolicyviolation #-}


-- | Generates an HTML @onseeked@ event handler with the given value.
onseeked :: Builder -> Attribute
onseeked :: Builder -> Attribute
onseeked = Builder -> Builder -> Attribute
TextAttribute Builder
" onseeked=\""
{-# INLINE onseeked #-}


-- | Generates an HTML @onseeking@ event handler with the given value.
onseeking :: Builder -> Attribute
onseeking :: Builder -> Attribute
onseeking = Builder -> Builder -> Attribute
TextAttribute Builder
" onseeking=\""
{-# INLINE onseeking #-}


-- | Generates an HTML @onselect@ event handler with the given value.
onselect :: Builder -> Attribute
onselect :: Builder -> Attribute
onselect = Builder -> Builder -> Attribute
TextAttribute Builder
" onselect=\""
{-# INLINE onselect #-}


-- | Generates an HTML @onslotchange@ event handler with the given value.
onslotchange :: Builder -> Attribute
onslotchange :: Builder -> Attribute
onslotchange = Builder -> Builder -> Attribute
TextAttribute Builder
" onslotchange=\""
{-# INLINE onslotchange #-}


-- | Generates an HTML @onstalled@ event handler with the given value.
onstalled :: Builder -> Attribute
onstalled :: Builder -> Attribute
onstalled = Builder -> Builder -> Attribute
TextAttribute Builder
" onstalled=\""
{-# INLINE onstalled #-}


-- | Generates an HTML @onstorage@ event handler with the given value.
onstorage :: Builder -> Attribute
onstorage :: Builder -> Attribute
onstorage = Builder -> Builder -> Attribute
TextAttribute Builder
" onstorage=\""
{-# INLINE onstorage #-}


-- | Generates an HTML @onsubmit@ event handler with the given value.
onsubmit :: Builder -> Attribute
onsubmit :: Builder -> Attribute
onsubmit = Builder -> Builder -> Attribute
TextAttribute Builder
" onsubmit=\""
{-# INLINE onsubmit #-}


-- | Generates an HTML @onsuspend@ event handler with the given value.
onsuspend :: Builder -> Attribute
onsuspend :: Builder -> Attribute
onsuspend = Builder -> Builder -> Attribute
TextAttribute Builder
" onsuspend=\""
{-# INLINE onsuspend #-}


-- | Generates an HTML @ontimeupdate@ event handler with the given value.
ontimeupdate :: Builder -> Attribute
ontimeupdate :: Builder -> Attribute
ontimeupdate = Builder -> Builder -> Attribute
TextAttribute Builder
" ontimeupdate=\""
{-# INLINE ontimeupdate #-}


-- | Generates an HTML @ontoggle@ event handler with the given value.
ontoggle :: Builder -> Attribute
ontoggle :: Builder -> Attribute
ontoggle = Builder -> Builder -> Attribute
TextAttribute Builder
" ontoggle=\""
{-# INLINE ontoggle #-}


-- | Generates an HTML @onunhandledrejection@ event handler with the given value.
onunhandledrejection :: Builder -> Attribute
onunhandledrejection :: Builder -> Attribute
onunhandledrejection = Builder -> Builder -> Attribute
TextAttribute Builder
" onunhandledrejection=\""
{-# INLINE onunhandledrejection #-}


-- | Generates an HTML @onunload@ event handler with the given value.
onunload :: Builder -> Attribute
onunload :: Builder -> Attribute
onunload = Builder -> Builder -> Attribute
TextAttribute Builder
" onunload=\""
{-# INLINE onunload #-}


-- | Generates an HTML @onvolumechange@ event handler with the given value.
onvolumechange :: Builder -> Attribute
onvolumechange :: Builder -> Attribute
onvolumechange = Builder -> Builder -> Attribute
TextAttribute Builder
" onvolumechange=\""
{-# INLINE onvolumechange #-}


-- | Generates an HTML @onwaiting@ event handler with the given value.
onwaiting :: Builder -> Attribute
onwaiting :: Builder -> Attribute
onwaiting = Builder -> Builder -> Attribute
TextAttribute Builder
" onwaiting=\""
{-# INLINE onwaiting #-}


-- | Generates an HTML @onwheel@ event handler with the given value.
onwheel :: Builder -> Attribute
onwheel :: Builder -> Attribute
onwheel = Builder -> Builder -> Attribute
TextAttribute Builder
" onwheel=\""
{-# INLINE onwheel #-}