{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE DataKinds #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE MultiParamTypeClasses #-}
module Miso.Svg.Event
(
onBegin
, onEnd
, onRepeat
, onAbort
, onError
, onResize
, onScroll
, onLoad
, onUnload
, onZoom
, onActivate
, onClick
, onFocusIn
, onFocusOut
, onMouseDown
, onMouseMove
, onMouseOut
, onMouseOver
, onMouseUp
) where
import Miso.Event
import Miso.Html.Event (onClick)
import Miso.Html.Internal
onBegin :: action -> Attribute action
onBegin action = on "begin" emptyDecoder $ \() -> action
onEnd :: action -> Attribute action
onEnd action = on "end" emptyDecoder $ \() -> action
onRepeat :: action -> Attribute action
onRepeat action = on "repeat" emptyDecoder $ \() -> action
onAbort :: action -> Attribute action
onAbort action = on "abort" emptyDecoder $ \() -> action
onError :: action -> Attribute action
onError action = on "error" emptyDecoder $ \() -> action
onResize :: action -> Attribute action
onResize action = on "resize" emptyDecoder $ \() -> action
onScroll :: action -> Attribute action
onScroll action = on "scroll" emptyDecoder $ \() -> action
onLoad :: action -> Attribute action
onLoad action = on "load" emptyDecoder $ \() -> action
onUnload :: action -> Attribute action
onUnload action = on "unload" emptyDecoder $ \() -> action
onZoom :: action -> Attribute action
onZoom action = on "zoom" emptyDecoder $ \() -> action
onActivate :: action -> Attribute action
onActivate action = on "activate" emptyDecoder $ \() -> action
onFocusIn :: action -> Attribute action
onFocusIn action = on "focusin" emptyDecoder $ \() -> action
onFocusOut :: action -> Attribute action
onFocusOut action = on "focusout" emptyDecoder $ \() -> action
onMouseDown :: action -> Attribute action
onMouseDown action = on "mousedown" emptyDecoder $ \() -> action
onMouseMove :: action -> Attribute action
onMouseMove action = on "mousemove" emptyDecoder $ \() -> action
onMouseOut :: action -> Attribute action
onMouseOut action = on "mouseout" emptyDecoder $ \() -> action
onMouseOver :: action -> Attribute action
onMouseOver action = on "mouseover" emptyDecoder $ \() -> action
onMouseUp :: action -> Attribute action
onMouseUp action = on "mouseup" emptyDecoder $ \() -> action