{-# LANGUAGE PatternSynonyms #-} {-# LANGUAGE ForeignFunctionInterface #-} {-# LANGUAGE JavaScriptFFI #-} -- For HasCallStack compatibility {-# LANGUAGE ImplicitParams, ConstraintKinds, KindSignatures #-} module GHCJS.DOM.JSFFI.Generated.HTMLFrameSetElement (js_setCols, setCols, js_getCols, getCols, js_setRows, setRows, js_getRows, getRows, blur, error, focus, focusin, focusout, load, resize, scroll, webKitWillRevealBottom, webKitWillRevealLeft, webKitWillRevealRight, webKitWillRevealTop, HTMLFrameSetElement(..), gTypeHTMLFrameSetElement) where import Prelude ((.), (==), (>>=), return, IO, Int, Float, Double, Bool(..), Maybe, maybe, fromIntegral, round, fmap, Show, Read, Eq, Ord) import qualified Prelude (error) import Data.Typeable (Typeable) import GHCJS.Types (JSVal(..), JSString) import GHCJS.Foreign (jsNull, jsUndefined) import GHCJS.Foreign.Callback (syncCallback, asyncCallback, syncCallback1, asyncCallback1, syncCallback2, asyncCallback2, OnBlocked(..)) import GHCJS.Marshal (ToJSVal(..), FromJSVal(..)) import GHCJS.Marshal.Pure (PToJSVal(..), PFromJSVal(..)) import Control.Monad (void) import Control.Monad.IO.Class (MonadIO(..)) import Data.Int (Int64) import Data.Word (Word, Word64) import Data.Maybe (fromJust) import Data.Traversable (mapM) import GHCJS.DOM.Types import Control.Applicative ((<$>)) import GHCJS.DOM.EventTargetClosures (EventName, unsafeEventName, unsafeEventNameAsync) import GHCJS.DOM.JSFFI.Generated.Enums foreign import javascript unsafe "$1[\"cols\"] = $2;" js_setCols :: HTMLFrameSetElement -> JSString -> IO () -- | setCols :: (MonadIO m, ToJSString val) => HTMLFrameSetElement -> val -> m () setCols self val = liftIO (js_setCols self (toJSString val)) foreign import javascript unsafe "$1[\"cols\"]" js_getCols :: HTMLFrameSetElement -> IO JSString -- | getCols :: (MonadIO m, FromJSString result) => HTMLFrameSetElement -> m result getCols self = liftIO (fromJSString <$> (js_getCols self)) foreign import javascript unsafe "$1[\"rows\"] = $2;" js_setRows :: HTMLFrameSetElement -> JSString -> IO () -- | setRows :: (MonadIO m, ToJSString val) => HTMLFrameSetElement -> val -> m () setRows self val = liftIO (js_setRows self (toJSString val)) foreign import javascript unsafe "$1[\"rows\"]" js_getRows :: HTMLFrameSetElement -> IO JSString -- | getRows :: (MonadIO m, FromJSString result) => HTMLFrameSetElement -> m result getRows self = liftIO (fromJSString <$> (js_getRows self)) -- | blur :: EventName HTMLFrameSetElement FocusEvent blur = unsafeEventNameAsync (toJSString "blur") -- | error :: EventName HTMLFrameSetElement UIEvent error = unsafeEventNameAsync (toJSString "error") -- | focus :: EventName HTMLFrameSetElement FocusEvent focus = unsafeEventNameAsync (toJSString "focus") -- | focusin :: EventName HTMLFrameSetElement onfocusin focusin = unsafeEventName (toJSString "focusin") -- | focusout :: EventName HTMLFrameSetElement onfocusout focusout = unsafeEventName (toJSString "focusout") -- | load :: EventName HTMLFrameSetElement UIEvent load = unsafeEventNameAsync (toJSString "load") -- | resize :: EventName HTMLFrameSetElement UIEvent resize = unsafeEventName (toJSString "resize") -- | scroll :: EventName HTMLFrameSetElement UIEvent scroll = unsafeEventName (toJSString "scroll") -- | webKitWillRevealBottom :: EventName HTMLFrameSetElement Event webKitWillRevealBottom = unsafeEventName (toJSString "webkitwillrevealbottom") -- | webKitWillRevealLeft :: EventName HTMLFrameSetElement Event webKitWillRevealLeft = unsafeEventName (toJSString "webkitwillrevealleft") -- | webKitWillRevealRight :: EventName HTMLFrameSetElement Event webKitWillRevealRight = unsafeEventName (toJSString "webkitwillrevealright") -- | webKitWillRevealTop :: EventName HTMLFrameSetElement Event webKitWillRevealTop = unsafeEventName (toJSString "webkitwillrevealtop")