{-# LANGUAGE PatternSynonyms #-} {-# LANGUAGE ForeignFunctionInterface #-} {-# LANGUAGE JavaScriptFFI #-} -- For HasCallStack compatibility {-# LANGUAGE ImplicitParams, ConstraintKinds, KindSignatures #-} 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, getIn1Unsafe, getIn1Unchecked, js_getIn2, getIn2, getIn2Unsafe, getIn2Unchecked, js_getScale, getScale, getScaleUnsafe, getScaleUnchecked, js_getXChannelSelector, getXChannelSelector, getXChannelSelectorUnsafe, getXChannelSelectorUnchecked, js_getYChannelSelector, getYChannelSelector, getYChannelSelectorUnsafe, getYChannelSelectorUnchecked, SVGFEDisplacementMapElement(..), gTypeSVGFEDisplacementMapElement) 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) 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 GHCJS.DOM.Types import Control.Applicative ((<$>)) import GHCJS.DOM.EventTargetClosures (EventName, unsafeEventName) import GHCJS.DOM.JSFFI.Generated.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 :: SVGFEDisplacementMapElement -> IO (Nullable SVGAnimatedString) -- | getIn1 :: (MonadIO m) => SVGFEDisplacementMapElement -> m (Maybe SVGAnimatedString) getIn1 self = liftIO (nullableToMaybe <$> (js_getIn1 (self))) -- | getIn1Unsafe :: (MonadIO m, HasCallStack) => SVGFEDisplacementMapElement -> m SVGAnimatedString getIn1Unsafe self = liftIO ((nullableToMaybe <$> (js_getIn1 (self))) >>= maybe (Prelude.error "Nothing to return") return) -- | getIn1Unchecked :: (MonadIO m) => SVGFEDisplacementMapElement -> m SVGAnimatedString getIn1Unchecked self = liftIO (fromJust . nullableToMaybe <$> (js_getIn1 (self))) foreign import javascript unsafe "$1[\"in2\"]" js_getIn2 :: SVGFEDisplacementMapElement -> IO (Nullable SVGAnimatedString) -- | getIn2 :: (MonadIO m) => SVGFEDisplacementMapElement -> m (Maybe SVGAnimatedString) getIn2 self = liftIO (nullableToMaybe <$> (js_getIn2 (self))) -- | getIn2Unsafe :: (MonadIO m, HasCallStack) => SVGFEDisplacementMapElement -> m SVGAnimatedString getIn2Unsafe self = liftIO ((nullableToMaybe <$> (js_getIn2 (self))) >>= maybe (Prelude.error "Nothing to return") return) -- | getIn2Unchecked :: (MonadIO m) => SVGFEDisplacementMapElement -> m SVGAnimatedString getIn2Unchecked self = liftIO (fromJust . nullableToMaybe <$> (js_getIn2 (self))) foreign import javascript unsafe "$1[\"scale\"]" js_getScale :: SVGFEDisplacementMapElement -> IO (Nullable SVGAnimatedNumber) -- | getScale :: (MonadIO m) => SVGFEDisplacementMapElement -> m (Maybe SVGAnimatedNumber) getScale self = liftIO (nullableToMaybe <$> (js_getScale (self))) -- | getScaleUnsafe :: (MonadIO m, HasCallStack) => SVGFEDisplacementMapElement -> m SVGAnimatedNumber getScaleUnsafe self = liftIO ((nullableToMaybe <$> (js_getScale (self))) >>= maybe (Prelude.error "Nothing to return") return) -- | getScaleUnchecked :: (MonadIO m) => SVGFEDisplacementMapElement -> m SVGAnimatedNumber getScaleUnchecked self = liftIO (fromJust . nullableToMaybe <$> (js_getScale (self))) foreign import javascript unsafe "$1[\"xChannelSelector\"]" js_getXChannelSelector :: SVGFEDisplacementMapElement -> IO (Nullable SVGAnimatedEnumeration) -- | getXChannelSelector :: (MonadIO m) => SVGFEDisplacementMapElement -> m (Maybe SVGAnimatedEnumeration) getXChannelSelector self = liftIO (nullableToMaybe <$> (js_getXChannelSelector (self))) -- | getXChannelSelectorUnsafe :: (MonadIO m, HasCallStack) => SVGFEDisplacementMapElement -> m SVGAnimatedEnumeration getXChannelSelectorUnsafe self = liftIO ((nullableToMaybe <$> (js_getXChannelSelector (self))) >>= maybe (Prelude.error "Nothing to return") return) -- | getXChannelSelectorUnchecked :: (MonadIO m) => SVGFEDisplacementMapElement -> m SVGAnimatedEnumeration getXChannelSelectorUnchecked self = liftIO (fromJust . nullableToMaybe <$> (js_getXChannelSelector (self))) foreign import javascript unsafe "$1[\"yChannelSelector\"]" js_getYChannelSelector :: SVGFEDisplacementMapElement -> IO (Nullable SVGAnimatedEnumeration) -- | getYChannelSelector :: (MonadIO m) => SVGFEDisplacementMapElement -> m (Maybe SVGAnimatedEnumeration) getYChannelSelector self = liftIO (nullableToMaybe <$> (js_getYChannelSelector (self))) -- | getYChannelSelectorUnsafe :: (MonadIO m, HasCallStack) => SVGFEDisplacementMapElement -> m SVGAnimatedEnumeration getYChannelSelectorUnsafe self = liftIO ((nullableToMaybe <$> (js_getYChannelSelector (self))) >>= maybe (Prelude.error "Nothing to return") return) -- | getYChannelSelectorUnchecked :: (MonadIO m) => SVGFEDisplacementMapElement -> m SVGAnimatedEnumeration getYChannelSelectorUnchecked self = liftIO (fromJust . nullableToMaybe <$> (js_getYChannelSelector (self)))