{-# LANGUAGE PatternSynonyms #-} {-# LANGUAGE ForeignFunctionInterface #-} {-# LANGUAGE JavaScriptFFI #-} -- For HasCallStack compatibility {-# LANGUAGE ImplicitParams, ConstraintKinds, KindSignatures #-} module GHCJS.DOM.JSFFI.Generated.SVGTextPositioningElement (js_getX, getX, getXUnsafe, getXUnchecked, js_getY, getY, getYUnsafe, getYUnchecked, js_getDx, getDx, getDxUnsafe, getDxUnchecked, js_getDy, getDy, getDyUnsafe, getDyUnchecked, js_getRotate, getRotate, getRotateUnsafe, getRotateUnchecked, SVGTextPositioningElement(..), gTypeSVGTextPositioningElement, IsSVGTextPositioningElement, toSVGTextPositioningElement) 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 foreign import javascript unsafe "$1[\"x\"]" js_getX :: SVGTextPositioningElement -> IO (Nullable SVGAnimatedLengthList) -- | getX :: (MonadIO m, IsSVGTextPositioningElement self) => self -> m (Maybe SVGAnimatedLengthList) getX self = liftIO (nullableToMaybe <$> (js_getX (toSVGTextPositioningElement self))) -- | getXUnsafe :: (MonadIO m, IsSVGTextPositioningElement self, HasCallStack) => self -> m SVGAnimatedLengthList getXUnsafe self = liftIO ((nullableToMaybe <$> (js_getX (toSVGTextPositioningElement self))) >>= maybe (Prelude.error "Nothing to return") return) -- | getXUnchecked :: (MonadIO m, IsSVGTextPositioningElement self) => self -> m SVGAnimatedLengthList getXUnchecked self = liftIO (fromJust . nullableToMaybe <$> (js_getX (toSVGTextPositioningElement self))) foreign import javascript unsafe "$1[\"y\"]" js_getY :: SVGTextPositioningElement -> IO (Nullable SVGAnimatedLengthList) -- | getY :: (MonadIO m, IsSVGTextPositioningElement self) => self -> m (Maybe SVGAnimatedLengthList) getY self = liftIO (nullableToMaybe <$> (js_getY (toSVGTextPositioningElement self))) -- | getYUnsafe :: (MonadIO m, IsSVGTextPositioningElement self, HasCallStack) => self -> m SVGAnimatedLengthList getYUnsafe self = liftIO ((nullableToMaybe <$> (js_getY (toSVGTextPositioningElement self))) >>= maybe (Prelude.error "Nothing to return") return) -- | getYUnchecked :: (MonadIO m, IsSVGTextPositioningElement self) => self -> m SVGAnimatedLengthList getYUnchecked self = liftIO (fromJust . nullableToMaybe <$> (js_getY (toSVGTextPositioningElement self))) foreign import javascript unsafe "$1[\"dx\"]" js_getDx :: SVGTextPositioningElement -> IO (Nullable SVGAnimatedLengthList) -- | getDx :: (MonadIO m, IsSVGTextPositioningElement self) => self -> m (Maybe SVGAnimatedLengthList) getDx self = liftIO (nullableToMaybe <$> (js_getDx (toSVGTextPositioningElement self))) -- | getDxUnsafe :: (MonadIO m, IsSVGTextPositioningElement self, HasCallStack) => self -> m SVGAnimatedLengthList getDxUnsafe self = liftIO ((nullableToMaybe <$> (js_getDx (toSVGTextPositioningElement self))) >>= maybe (Prelude.error "Nothing to return") return) -- | getDxUnchecked :: (MonadIO m, IsSVGTextPositioningElement self) => self -> m SVGAnimatedLengthList getDxUnchecked self = liftIO (fromJust . nullableToMaybe <$> (js_getDx (toSVGTextPositioningElement self))) foreign import javascript unsafe "$1[\"dy\"]" js_getDy :: SVGTextPositioningElement -> IO (Nullable SVGAnimatedLengthList) -- | getDy :: (MonadIO m, IsSVGTextPositioningElement self) => self -> m (Maybe SVGAnimatedLengthList) getDy self = liftIO (nullableToMaybe <$> (js_getDy (toSVGTextPositioningElement self))) -- | getDyUnsafe :: (MonadIO m, IsSVGTextPositioningElement self, HasCallStack) => self -> m SVGAnimatedLengthList getDyUnsafe self = liftIO ((nullableToMaybe <$> (js_getDy (toSVGTextPositioningElement self))) >>= maybe (Prelude.error "Nothing to return") return) -- | getDyUnchecked :: (MonadIO m, IsSVGTextPositioningElement self) => self -> m SVGAnimatedLengthList getDyUnchecked self = liftIO (fromJust . nullableToMaybe <$> (js_getDy (toSVGTextPositioningElement self))) foreign import javascript unsafe "$1[\"rotate\"]" js_getRotate :: SVGTextPositioningElement -> IO (Nullable SVGAnimatedNumberList) -- | getRotate :: (MonadIO m, IsSVGTextPositioningElement self) => self -> m (Maybe SVGAnimatedNumberList) getRotate self = liftIO (nullableToMaybe <$> (js_getRotate (toSVGTextPositioningElement self))) -- | getRotateUnsafe :: (MonadIO m, IsSVGTextPositioningElement self, HasCallStack) => self -> m SVGAnimatedNumberList getRotateUnsafe self = liftIO ((nullableToMaybe <$> (js_getRotate (toSVGTextPositioningElement self))) >>= maybe (Prelude.error "Nothing to return") return) -- | getRotateUnchecked :: (MonadIO m, IsSVGTextPositioningElement self) => self -> m SVGAnimatedNumberList getRotateUnchecked self = liftIO (fromJust . nullableToMaybe <$> (js_getRotate (toSVGTextPositioningElement self)))