{-# LANGUAGE PatternSynonyms, ForeignFunctionInterface, JavaScriptFFI #-} module GHCJS.DOM.JSFFI.Generated.SVGEllipseElement (js_getCx, getCx, getCxUnchecked, js_getCy, getCy, getCyUnchecked, js_getRx, getRx, getRxUnchecked, js_getRy, getRy, getRyUnchecked, SVGEllipseElement, castToSVGEllipseElement, gTypeSVGEllipseElement) 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 (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[\"cx\"]" js_getCx :: SVGEllipseElement -> IO (Nullable SVGAnimatedLength) -- | getCx :: (MonadIO m) => SVGEllipseElement -> m (Maybe SVGAnimatedLength) getCx self = liftIO (nullableToMaybe <$> (js_getCx (self))) -- | getCxUnchecked :: (MonadIO m) => SVGEllipseElement -> m SVGAnimatedLength getCxUnchecked self = liftIO (fromJust . nullableToMaybe <$> (js_getCx (self))) foreign import javascript unsafe "$1[\"cy\"]" js_getCy :: SVGEllipseElement -> IO (Nullable SVGAnimatedLength) -- | getCy :: (MonadIO m) => SVGEllipseElement -> m (Maybe SVGAnimatedLength) getCy self = liftIO (nullableToMaybe <$> (js_getCy (self))) -- | getCyUnchecked :: (MonadIO m) => SVGEllipseElement -> m SVGAnimatedLength getCyUnchecked self = liftIO (fromJust . nullableToMaybe <$> (js_getCy (self))) foreign import javascript unsafe "$1[\"rx\"]" js_getRx :: SVGEllipseElement -> IO (Nullable SVGAnimatedLength) -- | getRx :: (MonadIO m) => SVGEllipseElement -> m (Maybe SVGAnimatedLength) getRx self = liftIO (nullableToMaybe <$> (js_getRx (self))) -- | getRxUnchecked :: (MonadIO m) => SVGEllipseElement -> m SVGAnimatedLength getRxUnchecked self = liftIO (fromJust . nullableToMaybe <$> (js_getRx (self))) foreign import javascript unsafe "$1[\"ry\"]" js_getRy :: SVGEllipseElement -> IO (Nullable SVGAnimatedLength) -- | getRy :: (MonadIO m) => SVGEllipseElement -> m (Maybe SVGAnimatedLength) getRy self = liftIO (nullableToMaybe <$> (js_getRy (self))) -- | getRyUnchecked :: (MonadIO m) => SVGEllipseElement -> m SVGAnimatedLength getRyUnchecked self = liftIO (fromJust . nullableToMaybe <$> (js_getRy (self)))