Gtk2HsContentsIndex
System.Glib.Properties
Portabilityportable (depends on GHC)
Stabilityprovisional
Maintainergtk2hs-users@lists.sourceforge.net
Contents
per-type functions for getting and setting GObject properties
constructors for attributes backed by GObject properties
Description
Functions for getting and setting GObject properties
Synopsis
objectSetPropertyInt :: GObjectClass gobj => String -> gobj -> Int -> IO ()
objectGetPropertyInt :: GObjectClass gobj => String -> gobj -> IO Int
objectSetPropertyUInt :: GObjectClass gobj => String -> gobj -> Int -> IO ()
objectGetPropertyUInt :: GObjectClass gobj => String -> gobj -> IO Int
objectSetPropertyBool :: GObjectClass gobj => String -> gobj -> Bool -> IO ()
objectGetPropertyBool :: GObjectClass gobj => String -> gobj -> IO Bool
objectSetPropertyEnum :: (GObjectClass gobj, Enum enum) => String -> gobj -> enum -> IO ()
objectGetPropertyEnum :: (GObjectClass gobj, Enum enum) => String -> gobj -> IO enum
objectSetPropertyFlags :: (GObjectClass gobj, Flags flag) => String -> gobj -> [flag] -> IO ()
objectGetPropertyFlags :: (GObjectClass gobj, Flags flag) => String -> gobj -> IO [flag]
objectSetPropertyFloat :: GObjectClass gobj => String -> gobj -> Float -> IO ()
objectGetPropertyFloat :: GObjectClass gobj => String -> gobj -> IO Float
objectSetPropertyDouble :: GObjectClass gobj => String -> gobj -> Double -> IO ()
objectGetPropertyDouble :: GObjectClass gobj => String -> gobj -> IO Double
objectSetPropertyString :: GObjectClass gobj => String -> gobj -> String -> IO ()
objectGetPropertyString :: GObjectClass gobj => String -> gobj -> IO String
objectSetPropertyMaybeString :: GObjectClass gobj => String -> gobj -> Maybe String -> IO ()
objectGetPropertyMaybeString :: GObjectClass gobj => String -> gobj -> IO (Maybe String)
objectSetPropertyGObject :: (GObjectClass gobj, GObjectClass gobj') => String -> gobj -> gobj' -> IO ()
objectGetPropertyGObject :: (GObjectClass gobj, GObjectClass gobj') => String -> gobj -> IO gobj'
objectSetPropertyInternal :: GObjectClass gobj => (GValue -> a -> IO ()) -> String -> gobj -> a -> IO ()
objectGetPropertyInternal :: GObjectClass gobj => (GValue -> IO a) -> String -> gobj -> IO a
newAttrFromIntProperty :: GObjectClass gobj => String -> Attr gobj Int
readAttrFromIntProperty :: GObjectClass gobj => String -> ReadAttr gobj Int
newAttrFromUIntProperty :: GObjectClass gobj => String -> Attr gobj Int
writeAttrFromUIntProperty :: GObjectClass gobj => String -> WriteAttr gobj Int
newAttrFromBoolProperty :: GObjectClass gobj => String -> Attr gobj Bool
newAttrFromFloatProperty :: GObjectClass gobj => String -> Attr gobj Float
newAttrFromDoubleProperty :: GObjectClass gobj => String -> Attr gobj Double
newAttrFromEnumProperty :: (GObjectClass gobj, Enum enum) => String -> Attr gobj enum
readAttrFromEnumProperty :: (GObjectClass gobj, Enum enum) => String -> ReadAttr gobj enum
newAttrFromFlagsProperty :: (GObjectClass gobj, Flags flag) => String -> Attr gobj [flag]
newAttrFromStringProperty :: GObjectClass gobj => String -> Attr gobj String
writeAttrFromStringProperty :: GObjectClass gobj => String -> WriteAttr gobj String
newAttrFromMaybeStringProperty :: GObjectClass gobj => String -> Attr gobj (Maybe String)
newAttrFromObjectProperty :: (GObjectClass gobj, GObjectClass gobj', GObjectClass gobj'') => String -> ReadWriteAttr gobj gobj' gobj''
writeAttrFromObjectProperty :: (GObjectClass gobj, GObjectClass gobj') => String -> WriteAttr gobj gobj'
per-type functions for getting and setting GObject properties
objectSetPropertyInt :: GObjectClass gobj => String -> gobj -> Int -> IO ()
objectGetPropertyInt :: GObjectClass gobj => String -> gobj -> IO Int
objectSetPropertyUInt :: GObjectClass gobj => String -> gobj -> Int -> IO ()
objectGetPropertyUInt :: GObjectClass gobj => String -> gobj -> IO Int
objectSetPropertyBool :: GObjectClass gobj => String -> gobj -> Bool -> IO ()
objectGetPropertyBool :: GObjectClass gobj => String -> gobj -> IO Bool
objectSetPropertyEnum :: (GObjectClass gobj, Enum enum) => String -> gobj -> enum -> IO ()
objectGetPropertyEnum :: (GObjectClass gobj, Enum enum) => String -> gobj -> IO enum
objectSetPropertyFlags :: (GObjectClass gobj, Flags flag) => String -> gobj -> [flag] -> IO ()
objectGetPropertyFlags :: (GObjectClass gobj, Flags flag) => String -> gobj -> IO [flag]
objectSetPropertyFloat :: GObjectClass gobj => String -> gobj -> Float -> IO ()
objectGetPropertyFloat :: GObjectClass gobj => String -> gobj -> IO Float
objectSetPropertyDouble :: GObjectClass gobj => String -> gobj -> Double -> IO ()
objectGetPropertyDouble :: GObjectClass gobj => String -> gobj -> IO Double
objectSetPropertyString :: GObjectClass gobj => String -> gobj -> String -> IO ()
objectGetPropertyString :: GObjectClass gobj => String -> gobj -> IO String
objectSetPropertyMaybeString :: GObjectClass gobj => String -> gobj -> Maybe String -> IO ()
objectGetPropertyMaybeString :: GObjectClass gobj => String -> gobj -> IO (Maybe String)
objectSetPropertyGObject :: (GObjectClass gobj, GObjectClass gobj') => String -> gobj -> gobj' -> IO ()
objectGetPropertyGObject :: (GObjectClass gobj, GObjectClass gobj') => String -> gobj -> IO gobj'
objectSetPropertyInternal :: GObjectClass gobj => (GValue -> a -> IO ()) -> String -> gobj -> a -> IO ()
objectGetPropertyInternal :: GObjectClass gobj => (GValue -> IO a) -> String -> gobj -> IO a
constructors for attributes backed by GObject properties
newAttrFromIntProperty :: GObjectClass gobj => String -> Attr gobj Int
readAttrFromIntProperty :: GObjectClass gobj => String -> ReadAttr gobj Int
newAttrFromUIntProperty :: GObjectClass gobj => String -> Attr gobj Int
writeAttrFromUIntProperty :: GObjectClass gobj => String -> WriteAttr gobj Int
newAttrFromBoolProperty :: GObjectClass gobj => String -> Attr gobj Bool
newAttrFromFloatProperty :: GObjectClass gobj => String -> Attr gobj Float
newAttrFromDoubleProperty :: GObjectClass gobj => String -> Attr gobj Double
newAttrFromEnumProperty :: (GObjectClass gobj, Enum enum) => String -> Attr gobj enum
readAttrFromEnumProperty :: (GObjectClass gobj, Enum enum) => String -> ReadAttr gobj enum
newAttrFromFlagsProperty :: (GObjectClass gobj, Flags flag) => String -> Attr gobj [flag]
newAttrFromStringProperty :: GObjectClass gobj => String -> Attr gobj String
writeAttrFromStringProperty :: GObjectClass gobj => String -> WriteAttr gobj String
newAttrFromMaybeStringProperty :: GObjectClass gobj => String -> Attr gobj (Maybe String)
newAttrFromObjectProperty :: (GObjectClass gobj, GObjectClass gobj', GObjectClass gobj'') => String -> ReadWriteAttr gobj gobj' gobj''
writeAttrFromObjectProperty :: (GObjectClass gobj, GObjectClass gobj') => String -> WriteAttr gobj gobj'
Produced by Haddock version 0.7