module Graphics.UI.Gtk.WebKit.DOM.Geolocation(
clearWatch,
Geolocation,
castToGeolocation,
gTypeGeolocation,
GeolocationClass,
toGeolocation,
) where
import Prelude hiding (drop, error, print)
import Data.Typeable (Typeable)
import Foreign.Marshal (maybePeek, maybeWith)
import System.Glib.FFI (maybeNull, withForeignPtr, nullForeignPtr, Ptr, nullPtr, castPtr, Word, Int64, Word64, CChar(..), CInt(..), CUInt(..), CLong(..), CULong(..), CLLong(..), CULLong(..), CShort(..), CUShort(..), CFloat(..), CDouble(..), toBool, fromBool)
import System.Glib.UTFString (GlibString(..), readUTFString)
import Control.Applicative ((<$>))
import Control.Monad (void)
import Control.Monad.IO.Class (MonadIO(..))
import System.Glib.GError
import Graphics.UI.Gtk.WebKit.DOM.EventTargetClosures
import Graphics.UI.Gtk.WebKit.DOM.EventM
import Graphics.UI.Gtk.WebKit.Types
import Graphics.UI.Gtk.WebKit.DOM.Enums
 
clearWatch ::
           (MonadIO m, GeolocationClass self) => self -> Int -> m ()
clearWatch self watchID
  = liftIO
      ((\(Geolocation arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_geolocation_clear_watch argPtr1 arg2) (toGeolocation self)
         (fromIntegral watchID))
foreign import ccall safe "webkit_dom_geolocation_clear_watch"
  webkit_dom_geolocation_clear_watch :: ((Ptr Geolocation) -> (CLong -> (IO ())))