module Graphics.UI.Gtk.WebKit.DOM.HTMLOListElement
(htmloListElementSetCompact, htmloListElementGetCompact,
htmloListElementSetStart, htmloListElementGetStart,
htmloListElementSetReversed, htmloListElementGetReversed,
HTMLOListElement, HTMLOListElementClass, castToHTMLOListElement,
gTypeHTMLOListElement, toHTMLOListElement)
where
import System.Glib.FFI
import System.Glib.UTFString
import Control.Applicative
import Graphics.UI.Gtk.WebKit.Types
import System.Glib.GError
import Graphics.UI.Gtk.WebKit.DOM.EventM
htmloListElementSetCompact ::
(HTMLOListElementClass self) => self -> Bool -> IO ()
htmloListElementSetCompact self val
= (\(HTMLOListElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_htmlo_list_element_set_compact argPtr1 arg2)
(toHTMLOListElement self)
(fromBool val)
htmloListElementGetCompact ::
(HTMLOListElementClass self) => self -> IO Bool
htmloListElementGetCompact self
= toBool <$>
((\(HTMLOListElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_htmlo_list_element_get_compact argPtr1)
(toHTMLOListElement self))
htmloListElementSetStart ::
(HTMLOListElementClass self) => self -> Int -> IO ()
htmloListElementSetStart self val
= (\(HTMLOListElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_htmlo_list_element_set_start argPtr1 arg2)
(toHTMLOListElement self)
(fromIntegral val)
htmloListElementGetStart ::
(HTMLOListElementClass self) => self -> IO Int
htmloListElementGetStart self
= fromIntegral <$>
((\(HTMLOListElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_htmlo_list_element_get_start argPtr1)
(toHTMLOListElement self))
htmloListElementSetReversed ::
(HTMLOListElementClass self) => self -> Bool -> IO ()
htmloListElementSetReversed self val
= (\(HTMLOListElement arg1) arg2 -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_htmlo_list_element_set_reversed argPtr1 arg2)
(toHTMLOListElement self)
(fromBool val)
htmloListElementGetReversed ::
(HTMLOListElementClass self) => self -> IO Bool
htmloListElementGetReversed self
= toBool <$>
((\(HTMLOListElement arg1) -> withForeignPtr arg1 $ \argPtr1 ->webkit_dom_htmlo_list_element_get_reversed argPtr1)
(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))