{-# LANGUAGE OverloadedStrings #-}
module Html.Events
(
onauxclick
, onafterprint
, onbeforematch
, onbeforeprint
, onbeforeunload
, onblur
, oncancel
, oncanplay
, oncanplaythrough
, onchange
, onclick
, onclose
, oncontextlost
, oncontextmenu
, oncontextrestored
, oncopy
, oncuechange
, oncut
, ondblclick
, ondrag
, ondragend
, ondragenter
, ondragleave
, ondragover
, ondragstart
, ondrop
, ondurationchange
, onemptied
, onended
, onerror
, onfocus
, onformdata
, onhashchange
, oninput
, oninvalid
, onkeydown
, onkeypress
, onkeyup
, onlanguagechange
, onload
, onloadeddata
, onloadedmetadata
, onloadstart
, onmessage
, onmessageerror
, onmousedown
, onmouseenter
, onmouseleave
, onmousemove
, onmouseout
, onmouseover
, onmouseup
, onoffline
, ononline
, onpagehide
, onpageshow
, onpaste
, onpause
, onplay
, onplaying
, onpopstate
, onprogress
, onratechange
, onreset
, onresize
, onrejectionhandled
, onscroll
, onsecuritypolicyviolation
, onseeked
, onseeking
, onselect
, onslotchange
, onstalled
, onstorage
, onsubmit
, onsuspend
, ontimeupdate
, ontoggle
, onunhandledrejection
, onunload
, onvolumechange
, onwaiting
, onwheel
) where
import Data.Text.Lazy.Builder (Builder)
import Html (Attribute(..))
onauxclick :: Builder -> Attribute
onauxclick :: Builder -> Attribute
onauxclick = Builder -> Builder -> Attribute
TextAttribute Builder
" onauxclick=\""
{-# INLINE onauxclick #-}
onafterprint :: Builder -> Attribute
onafterprint :: Builder -> Attribute
onafterprint = Builder -> Builder -> Attribute
TextAttribute Builder
" onafterprint=\""
{-# INLINE onafterprint #-}
onbeforematch :: Builder -> Attribute
onbeforematch :: Builder -> Attribute
onbeforematch = Builder -> Builder -> Attribute
TextAttribute Builder
" onbeforematch=\""
{-# INLINE onbeforematch #-}
onbeforeprint :: Builder -> Attribute
onbeforeprint :: Builder -> Attribute
onbeforeprint = Builder -> Builder -> Attribute
TextAttribute Builder
" onbeforeprint=\""
{-# INLINE onbeforeprint #-}
onbeforeunload :: Builder -> Attribute
onbeforeunload :: Builder -> Attribute
onbeforeunload = Builder -> Builder -> Attribute
TextAttribute Builder
" onbeforeunload=\""
{-# INLINE onbeforeunload #-}
onblur :: Builder -> Attribute
onblur :: Builder -> Attribute
onblur = Builder -> Builder -> Attribute
TextAttribute Builder
" onblur=\""
{-# INLINE onblur #-}
oncancel :: Builder -> Attribute
oncancel :: Builder -> Attribute
oncancel = Builder -> Builder -> Attribute
TextAttribute Builder
" oncancel=\""
{-# INLINE oncancel #-}
oncanplay :: Builder -> Attribute
oncanplay :: Builder -> Attribute
oncanplay = Builder -> Builder -> Attribute
TextAttribute Builder
" oncanplay=\""
{-# INLINE oncanplay #-}
oncanplaythrough :: Builder -> Attribute
oncanplaythrough :: Builder -> Attribute
oncanplaythrough = Builder -> Builder -> Attribute
TextAttribute Builder
" oncanplaythrough=\""
{-# INLINE oncanplaythrough #-}
onchange :: Builder -> Attribute
onchange :: Builder -> Attribute
onchange = Builder -> Builder -> Attribute
TextAttribute Builder
" onchange=\""
{-# INLINE onchange #-}
onclick :: Builder -> Attribute
onclick :: Builder -> Attribute
onclick = Builder -> Builder -> Attribute
TextAttribute Builder
" onclick=\""
{-# INLINE onclick #-}
onclose :: Builder -> Attribute
onclose :: Builder -> Attribute
onclose = Builder -> Builder -> Attribute
TextAttribute Builder
" onclose=\""
{-# INLINE onclose #-}
oncontextlost :: Builder -> Attribute
oncontextlost :: Builder -> Attribute
oncontextlost = Builder -> Builder -> Attribute
TextAttribute Builder
" oncontextlost=\""
{-# INLINE oncontextlost #-}
oncontextmenu :: Builder -> Attribute
= Builder -> Builder -> Attribute
TextAttribute Builder
" oncontextmenu=\""
{-# INLINE oncontextmenu #-}
oncontextrestored :: Builder -> Attribute
oncontextrestored :: Builder -> Attribute
oncontextrestored = Builder -> Builder -> Attribute
TextAttribute Builder
" oncontextrestored=\""
{-# INLINE oncontextrestored #-}
oncopy :: Builder -> Attribute
oncopy :: Builder -> Attribute
oncopy = Builder -> Builder -> Attribute
TextAttribute Builder
" oncopy=\""
{-# INLINE oncopy #-}
oncuechange :: Builder -> Attribute
oncuechange :: Builder -> Attribute
oncuechange = Builder -> Builder -> Attribute
TextAttribute Builder
" oncuechange=\""
{-# INLINE oncuechange #-}
oncut :: Builder -> Attribute
oncut :: Builder -> Attribute
oncut = Builder -> Builder -> Attribute
TextAttribute Builder
" oncut=\""
{-# INLINE oncut #-}
ondblclick :: Builder -> Attribute
ondblclick :: Builder -> Attribute
ondblclick = Builder -> Builder -> Attribute
TextAttribute Builder
" ondblclick=\""
{-# INLINE ondblclick #-}
ondrag :: Builder -> Attribute
ondrag :: Builder -> Attribute
ondrag = Builder -> Builder -> Attribute
TextAttribute Builder
" ondrag=\""
{-# INLINE ondrag #-}
ondragend :: Builder -> Attribute
ondragend :: Builder -> Attribute
ondragend = Builder -> Builder -> Attribute
TextAttribute Builder
" ondragend=\""
{-# INLINE ondragend #-}
ondragenter :: Builder -> Attribute
ondragenter :: Builder -> Attribute
ondragenter = Builder -> Builder -> Attribute
TextAttribute Builder
" ondragenter=\""
{-# INLINE ondragenter #-}
ondragleave :: Builder -> Attribute
ondragleave :: Builder -> Attribute
ondragleave = Builder -> Builder -> Attribute
TextAttribute Builder
" ondragleave=\""
{-# INLINE ondragleave #-}
ondragover :: Builder -> Attribute
ondragover :: Builder -> Attribute
ondragover = Builder -> Builder -> Attribute
TextAttribute Builder
" ondragover=\""
{-# INLINE ondragover #-}
ondragstart :: Builder -> Attribute
ondragstart :: Builder -> Attribute
ondragstart = Builder -> Builder -> Attribute
TextAttribute Builder
" ondragstart=\""
{-# INLINE ondragstart #-}
ondrop :: Builder -> Attribute
ondrop :: Builder -> Attribute
ondrop = Builder -> Builder -> Attribute
TextAttribute Builder
" ondrop=\""
{-# INLINE ondrop #-}
ondurationchange :: Builder -> Attribute
ondurationchange :: Builder -> Attribute
ondurationchange = Builder -> Builder -> Attribute
TextAttribute Builder
" ondurationchange=\""
{-# INLINE ondurationchange #-}
onemptied :: Builder -> Attribute
onemptied :: Builder -> Attribute
onemptied = Builder -> Builder -> Attribute
TextAttribute Builder
" onemptied=\""
{-# INLINE onemptied #-}
onended :: Builder -> Attribute
onended :: Builder -> Attribute
onended = Builder -> Builder -> Attribute
TextAttribute Builder
" onended=\""
{-# INLINE onended #-}
onerror :: Builder -> Attribute
onerror :: Builder -> Attribute
onerror = Builder -> Builder -> Attribute
TextAttribute Builder
" onerror=\""
{-# INLINE onerror #-}
onfocus :: Builder -> Attribute
onfocus :: Builder -> Attribute
onfocus = Builder -> Builder -> Attribute
TextAttribute Builder
" onfocus=\""
{-# INLINE onfocus #-}
onformdata :: Builder -> Attribute
onformdata :: Builder -> Attribute
onformdata = Builder -> Builder -> Attribute
TextAttribute Builder
" onformdata=\""
{-# INLINE onformdata #-}
onhashchange :: Builder -> Attribute
onhashchange :: Builder -> Attribute
onhashchange = Builder -> Builder -> Attribute
TextAttribute Builder
" onhashchange=\""
{-# INLINE onhashchange #-}
oninput :: Builder -> Attribute
oninput :: Builder -> Attribute
oninput = Builder -> Builder -> Attribute
TextAttribute Builder
" oninput=\""
{-# INLINE oninput #-}
oninvalid :: Builder -> Attribute
oninvalid :: Builder -> Attribute
oninvalid = Builder -> Builder -> Attribute
TextAttribute Builder
" oninvalid=\""
{-# INLINE oninvalid #-}
onkeydown :: Builder -> Attribute
onkeydown :: Builder -> Attribute
onkeydown = Builder -> Builder -> Attribute
TextAttribute Builder
" onkeydown=\""
{-# INLINE onkeydown #-}
onkeypress :: Builder -> Attribute
onkeypress :: Builder -> Attribute
onkeypress = Builder -> Builder -> Attribute
TextAttribute Builder
" onkeypress=\""
{-# INLINE onkeypress #-}
onkeyup :: Builder -> Attribute
onkeyup :: Builder -> Attribute
onkeyup = Builder -> Builder -> Attribute
TextAttribute Builder
" onkeyup=\""
{-# INLINE onkeyup #-}
onlanguagechange :: Builder -> Attribute
onlanguagechange :: Builder -> Attribute
onlanguagechange = Builder -> Builder -> Attribute
TextAttribute Builder
" onlanguagechange=\""
{-# INLINE onlanguagechange #-}
onload :: Builder -> Attribute
onload :: Builder -> Attribute
onload = Builder -> Builder -> Attribute
TextAttribute Builder
" onload=\""
{-# INLINE onload #-}
onloadeddata :: Builder -> Attribute
onloadeddata :: Builder -> Attribute
onloadeddata = Builder -> Builder -> Attribute
TextAttribute Builder
" onloadeddata=\""
{-# INLINE onloadeddata #-}
onloadedmetadata :: Builder -> Attribute
onloadedmetadata :: Builder -> Attribute
onloadedmetadata = Builder -> Builder -> Attribute
TextAttribute Builder
" onloadedmetadata=\""
{-# INLINE onloadedmetadata #-}
onloadstart :: Builder -> Attribute
onloadstart :: Builder -> Attribute
onloadstart = Builder -> Builder -> Attribute
TextAttribute Builder
" onloadstart=\""
{-# INLINE onloadstart #-}
onmessage :: Builder -> Attribute
onmessage :: Builder -> Attribute
onmessage = Builder -> Builder -> Attribute
TextAttribute Builder
" onmessage=\""
{-# INLINE onmessage #-}
onmessageerror :: Builder -> Attribute
onmessageerror :: Builder -> Attribute
onmessageerror = Builder -> Builder -> Attribute
TextAttribute Builder
" onmessageerror=\""
{-# INLINE onmessageerror #-}
onmousedown :: Builder -> Attribute
onmousedown :: Builder -> Attribute
onmousedown = Builder -> Builder -> Attribute
TextAttribute Builder
" onmousedown=\""
{-# INLINE onmousedown #-}
onmouseenter :: Builder -> Attribute
onmouseenter :: Builder -> Attribute
onmouseenter = Builder -> Builder -> Attribute
TextAttribute Builder
" onmouseenter=\""
{-# INLINE onmouseenter #-}
onmouseleave :: Builder -> Attribute
onmouseleave :: Builder -> Attribute
onmouseleave = Builder -> Builder -> Attribute
TextAttribute Builder
" onmouseleave=\""
{-# INLINE onmouseleave #-}
onmousemove :: Builder -> Attribute
onmousemove :: Builder -> Attribute
onmousemove = Builder -> Builder -> Attribute
TextAttribute Builder
" onmousemove=\""
{-# INLINE onmousemove #-}
onmouseout :: Builder -> Attribute
onmouseout :: Builder -> Attribute
onmouseout = Builder -> Builder -> Attribute
TextAttribute Builder
" onmouseout=\""
{-# INLINE onmouseout #-}
onmouseover :: Builder -> Attribute
onmouseover :: Builder -> Attribute
onmouseover = Builder -> Builder -> Attribute
TextAttribute Builder
" onmouseover=\""
{-# INLINE onmouseover #-}
onmouseup :: Builder -> Attribute
onmouseup :: Builder -> Attribute
onmouseup = Builder -> Builder -> Attribute
TextAttribute Builder
" onmouseup=\""
{-# INLINE onmouseup #-}
onoffline :: Builder -> Attribute
onoffline :: Builder -> Attribute
onoffline = Builder -> Builder -> Attribute
TextAttribute Builder
" onoffline=\""
{-# INLINE onoffline #-}
ononline :: Builder -> Attribute
ononline :: Builder -> Attribute
ononline = Builder -> Builder -> Attribute
TextAttribute Builder
" ononline=\""
{-# INLINE ononline #-}
onpagehide :: Builder -> Attribute
onpagehide :: Builder -> Attribute
onpagehide = Builder -> Builder -> Attribute
TextAttribute Builder
" onpagehide=\""
{-# INLINE onpagehide #-}
onpageshow :: Builder -> Attribute
onpageshow :: Builder -> Attribute
onpageshow = Builder -> Builder -> Attribute
TextAttribute Builder
" onpageshow=\""
{-# INLINE onpageshow #-}
onpaste :: Builder -> Attribute
onpaste :: Builder -> Attribute
onpaste = Builder -> Builder -> Attribute
TextAttribute Builder
" onpaste=\""
{-# INLINE onpaste #-}
onpause :: Builder -> Attribute
onpause :: Builder -> Attribute
onpause = Builder -> Builder -> Attribute
TextAttribute Builder
" onpause=\""
{-# INLINE onpause #-}
onplay :: Builder -> Attribute
onplay :: Builder -> Attribute
onplay = Builder -> Builder -> Attribute
TextAttribute Builder
" onplay=\""
{-# INLINE onplay #-}
onplaying :: Builder -> Attribute
onplaying :: Builder -> Attribute
onplaying = Builder -> Builder -> Attribute
TextAttribute Builder
" onplaying=\""
{-# INLINE onplaying #-}
onpopstate :: Builder -> Attribute
onpopstate :: Builder -> Attribute
onpopstate = Builder -> Builder -> Attribute
TextAttribute Builder
" onpopstate=\""
{-# INLINE onpopstate #-}
onprogress :: Builder -> Attribute
onprogress :: Builder -> Attribute
onprogress = Builder -> Builder -> Attribute
TextAttribute Builder
" onprogress=\""
{-# INLINE onprogress #-}
onratechange :: Builder -> Attribute
onratechange :: Builder -> Attribute
onratechange = Builder -> Builder -> Attribute
TextAttribute Builder
" onratechange=\""
{-# INLINE onratechange #-}
onreset :: Builder -> Attribute
onreset :: Builder -> Attribute
onreset = Builder -> Builder -> Attribute
TextAttribute Builder
" onreset=\""
{-# INLINE onreset #-}
onresize :: Builder -> Attribute
onresize :: Builder -> Attribute
onresize = Builder -> Builder -> Attribute
TextAttribute Builder
" onresize=\""
{-# INLINE onresize #-}
onrejectionhandled :: Builder -> Attribute
onrejectionhandled :: Builder -> Attribute
onrejectionhandled = Builder -> Builder -> Attribute
TextAttribute Builder
" onrejectionhandled=\""
{-# INLINE onrejectionhandled #-}
onscroll :: Builder -> Attribute
onscroll :: Builder -> Attribute
onscroll = Builder -> Builder -> Attribute
TextAttribute Builder
" onscroll=\""
{-# INLINE onscroll #-}
onsecuritypolicyviolation :: Builder -> Attribute
onsecuritypolicyviolation :: Builder -> Attribute
onsecuritypolicyviolation = Builder -> Builder -> Attribute
TextAttribute Builder
" onsecuritypolicyviolation=\""
{-# INLINE onsecuritypolicyviolation #-}
onseeked :: Builder -> Attribute
onseeked :: Builder -> Attribute
onseeked = Builder -> Builder -> Attribute
TextAttribute Builder
" onseeked=\""
{-# INLINE onseeked #-}
onseeking :: Builder -> Attribute
onseeking :: Builder -> Attribute
onseeking = Builder -> Builder -> Attribute
TextAttribute Builder
" onseeking=\""
{-# INLINE onseeking #-}
onselect :: Builder -> Attribute
onselect :: Builder -> Attribute
onselect = Builder -> Builder -> Attribute
TextAttribute Builder
" onselect=\""
{-# INLINE onselect #-}
onslotchange :: Builder -> Attribute
onslotchange :: Builder -> Attribute
onslotchange = Builder -> Builder -> Attribute
TextAttribute Builder
" onslotchange=\""
{-# INLINE onslotchange #-}
onstalled :: Builder -> Attribute
onstalled :: Builder -> Attribute
onstalled = Builder -> Builder -> Attribute
TextAttribute Builder
" onstalled=\""
{-# INLINE onstalled #-}
onstorage :: Builder -> Attribute
onstorage :: Builder -> Attribute
onstorage = Builder -> Builder -> Attribute
TextAttribute Builder
" onstorage=\""
{-# INLINE onstorage #-}
onsubmit :: Builder -> Attribute
onsubmit :: Builder -> Attribute
onsubmit = Builder -> Builder -> Attribute
TextAttribute Builder
" onsubmit=\""
{-# INLINE onsubmit #-}
onsuspend :: Builder -> Attribute
onsuspend :: Builder -> Attribute
onsuspend = Builder -> Builder -> Attribute
TextAttribute Builder
" onsuspend=\""
{-# INLINE onsuspend #-}
ontimeupdate :: Builder -> Attribute
ontimeupdate :: Builder -> Attribute
ontimeupdate = Builder -> Builder -> Attribute
TextAttribute Builder
" ontimeupdate=\""
{-# INLINE ontimeupdate #-}
ontoggle :: Builder -> Attribute
ontoggle :: Builder -> Attribute
ontoggle = Builder -> Builder -> Attribute
TextAttribute Builder
" ontoggle=\""
{-# INLINE ontoggle #-}
onunhandledrejection :: Builder -> Attribute
onunhandledrejection :: Builder -> Attribute
onunhandledrejection = Builder -> Builder -> Attribute
TextAttribute Builder
" onunhandledrejection=\""
{-# INLINE onunhandledrejection #-}
onunload :: Builder -> Attribute
onunload :: Builder -> Attribute
onunload = Builder -> Builder -> Attribute
TextAttribute Builder
" onunload=\""
{-# INLINE onunload #-}
onvolumechange :: Builder -> Attribute
onvolumechange :: Builder -> Attribute
onvolumechange = Builder -> Builder -> Attribute
TextAttribute Builder
" onvolumechange=\""
{-# INLINE onvolumechange #-}
onwaiting :: Builder -> Attribute
onwaiting :: Builder -> Attribute
onwaiting = Builder -> Builder -> Attribute
TextAttribute Builder
" onwaiting=\""
{-# INLINE onwaiting #-}
onwheel :: Builder -> Attribute
onwheel :: Builder -> Attribute
onwheel = Builder -> Builder -> Attribute
TextAttribute Builder
" onwheel=\""
{-# INLINE onwheel #-}