-- GENERATED by C->Haskell Compiler, version 0.13.13 (gtk2hs branch) "Bin IO", 27 May 2012 (Haskell)
-- Edit the ORIGNAL .chs file instead!


{-# LINE 1 "./Graphics/UI/Gtk/WebKit/DOM/HTMLOListElement.chs" #-}
module Graphics.UI.Gtk.WebKit.DOM.HTMLOListElement(
setCompact,
getCompact,
setStart,
getStart,
setReversed,
getReversed,
HTMLOListElement,
castToHTMLOListElement,
gTypeHTMLOListElement,
HTMLOListElementClass,
toHTMLOListElement,
) 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
{-# LINE 25 "./Graphics/UI/Gtk/WebKit/DOM/HTMLOListElement.chs" #-}
import Graphics.UI.Gtk.WebKit.DOM.Enums

 
setCompact ::
           (MonadIO m, HTMLOListElementClass self) => self -> Bool -> m ()
setCompact self val
  = liftIO
      ((\(HTMLOListElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_htmlo_list_element_set_compact argPtr1 arg2)
{-# LINE 33 "./Graphics/UI/Gtk/WebKit/DOM/HTMLOListElement.chs" #-}
         (toHTMLOListElement self)
         (fromBool val))
 
getCompact ::
           (MonadIO m, HTMLOListElementClass self) => self -> m Bool
getCompact self
  = liftIO
      (toBool <$>
         ((\(HTMLOListElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_htmlo_list_element_get_compact argPtr1)
{-# LINE 42 "./Graphics/UI/Gtk/WebKit/DOM/HTMLOListElement.chs" #-}
            (toHTMLOListElement self)))
 
setStart ::
         (MonadIO m, HTMLOListElementClass self) => self -> Int -> m ()
setStart self val
  = liftIO
      ((\(HTMLOListElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_htmlo_list_element_set_start argPtr1 arg2)
{-# LINE 49 "./Graphics/UI/Gtk/WebKit/DOM/HTMLOListElement.chs" #-}
         (toHTMLOListElement self)
         (fromIntegral val))
 
getStart ::
         (MonadIO m, HTMLOListElementClass self) => self -> m Int
getStart self
  = liftIO
      (fromIntegral <$>
         ((\(HTMLOListElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_htmlo_list_element_get_start argPtr1)
{-# LINE 58 "./Graphics/UI/Gtk/WebKit/DOM/HTMLOListElement.chs" #-}
            (toHTMLOListElement self)))
 
setReversed ::
            (MonadIO m, HTMLOListElementClass self) => self -> Bool -> m ()
setReversed self val
  = liftIO
      ((\(HTMLOListElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_htmlo_list_element_set_reversed argPtr1 arg2)
{-# LINE 65 "./Graphics/UI/Gtk/WebKit/DOM/HTMLOListElement.chs" #-}
         (toHTMLOListElement self)
         (fromBool val))
 
getReversed ::
            (MonadIO m, HTMLOListElementClass self) => self -> m Bool
getReversed self
  = liftIO
      (toBool <$>
         ((\(HTMLOListElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_htmlo_list_element_get_reversed argPtr1)
{-# LINE 74 "./Graphics/UI/Gtk/WebKit/DOM/HTMLOListElement.chs" #-}
            (toHTMLOListElement self)))

foreign import ccall safe "webkit_dom_htmlo_list_element_set_compact"
  webkit_dom_htmlo_list_element_set_compact :: ((Ptr HTMLOListElement) -> (CInt -> (IO ())))

foreign import ccall safe "webkit_dom_htmlo_list_element_get_compact"
  webkit_dom_htmlo_list_element_get_compact :: ((Ptr HTMLOListElement) -> (IO CInt))

foreign import ccall safe "webkit_dom_htmlo_list_element_set_start"
  webkit_dom_htmlo_list_element_set_start :: ((Ptr HTMLOListElement) -> (CLong -> (IO ())))

foreign import ccall safe "webkit_dom_htmlo_list_element_get_start"
  webkit_dom_htmlo_list_element_get_start :: ((Ptr HTMLOListElement) -> (IO CLong))

foreign import ccall safe "webkit_dom_htmlo_list_element_set_reversed"
  webkit_dom_htmlo_list_element_set_reversed :: ((Ptr HTMLOListElement) -> (CInt -> (IO ())))

foreign import ccall safe "webkit_dom_htmlo_list_element_get_reversed"
  webkit_dom_htmlo_list_element_get_reversed :: ((Ptr HTMLOListElement) -> (IO CInt))