{-# LANGUAGE PatternSynonyms, ForeignFunctionInterface, JavaScriptFFI #-} module GHCJS.DOM.JSFFI.Generated.SVGFEDisplacementMapElement (pattern SVG_CHANNEL_UNKNOWN, pattern SVG_CHANNEL_R, pattern SVG_CHANNEL_G, pattern SVG_CHANNEL_B, pattern SVG_CHANNEL_A, js_getIn1, getIn1, js_getIn2, getIn2, js_getScale, getScale, js_getXChannelSelector, getXChannelSelector, js_getYChannelSelector, getYChannelSelector, SVGFEDisplacementMapElement, castToSVGFEDisplacementMapElement, gTypeSVGFEDisplacementMapElement) where import Prelude ((.), (==), (>>=), return, IO, Int, Float, Double, Bool(..), Maybe, maybe, fromIntegral, round, fmap, Show, Read, Eq, Ord) import Data.Typeable (Typeable) import GHCJS.Types (JSRef(..), JSString, castRef) import GHCJS.Foreign (jsNull) import GHCJS.Foreign.Callback (syncCallback, asyncCallback, syncCallback1, asyncCallback1, syncCallback2, asyncCallback2, OnBlocked(..)) import GHCJS.Marshal (ToJSRef(..), FromJSRef(..)) import GHCJS.Marshal.Pure (PToJSRef(..), PFromJSRef(..)) import Control.Monad.IO.Class (MonadIO(..)) import Data.Int (Int64) import Data.Word (Word, Word64) import GHCJS.DOM.Types import Control.Applicative ((<$>)) import GHCJS.DOM.EventTargetClosures (EventName, unsafeEventName) import GHCJS.DOM.Enums pattern SVG_CHANNEL_UNKNOWN = 0 pattern SVG_CHANNEL_R = 1 pattern SVG_CHANNEL_G = 2 pattern SVG_CHANNEL_B = 3 pattern SVG_CHANNEL_A = 4 foreign import javascript unsafe "$1[\"in1\"]" js_getIn1 :: JSRef SVGFEDisplacementMapElement -> IO (JSRef SVGAnimatedString) -- | getIn1 :: (MonadIO m) => SVGFEDisplacementMapElement -> m (Maybe SVGAnimatedString) getIn1 self = liftIO ((js_getIn1 (unSVGFEDisplacementMapElement self)) >>= fromJSRef) foreign import javascript unsafe "$1[\"in2\"]" js_getIn2 :: JSRef SVGFEDisplacementMapElement -> IO (JSRef SVGAnimatedString) -- | getIn2 :: (MonadIO m) => SVGFEDisplacementMapElement -> m (Maybe SVGAnimatedString) getIn2 self = liftIO ((js_getIn2 (unSVGFEDisplacementMapElement self)) >>= fromJSRef) foreign import javascript unsafe "$1[\"scale\"]" js_getScale :: JSRef SVGFEDisplacementMapElement -> IO (JSRef SVGAnimatedNumber) -- | getScale :: (MonadIO m) => SVGFEDisplacementMapElement -> m (Maybe SVGAnimatedNumber) getScale self = liftIO ((js_getScale (unSVGFEDisplacementMapElement self)) >>= fromJSRef) foreign import javascript unsafe "$1[\"xChannelSelector\"]" js_getXChannelSelector :: JSRef SVGFEDisplacementMapElement -> IO (JSRef SVGAnimatedEnumeration) -- | getXChannelSelector :: (MonadIO m) => SVGFEDisplacementMapElement -> m (Maybe SVGAnimatedEnumeration) getXChannelSelector self = liftIO ((js_getXChannelSelector (unSVGFEDisplacementMapElement self)) >>= fromJSRef) foreign import javascript unsafe "$1[\"yChannelSelector\"]" js_getYChannelSelector :: JSRef SVGFEDisplacementMapElement -> IO (JSRef SVGAnimatedEnumeration) -- | getYChannelSelector :: (MonadIO m) => SVGFEDisplacementMapElement -> m (Maybe SVGAnimatedEnumeration) getYChannelSelector self = liftIO ((js_getYChannelSelector (unSVGFEDisplacementMapElement self)) >>= fromJSRef)