{-# LANGUAGE ImplicitParams, RankNTypes, TypeApplications #-}
#if (MIN_VERSION_haskell_gi_overloading(1,0,0) && !defined(__HADDOCK_VERSION__))
#define ENABLE_OVERLOADING
#endif
module GI.Dazzle.Objects.PreferencesFontButton
(
PreferencesFontButton(..) ,
IsPreferencesFontButton ,
toPreferencesFontButton ,
#if defined(ENABLE_OVERLOADING)
ResolvePreferencesFontButtonMethod ,
#endif
#if defined(ENABLE_OVERLOADING)
PreferencesFontButtonKeyPropertyInfo ,
#endif
constructPreferencesFontButtonKey ,
getPreferencesFontButtonKey ,
#if defined(ENABLE_OVERLOADING)
preferencesFontButtonKey ,
#endif
#if defined(ENABLE_OVERLOADING)
PreferencesFontButtonTitlePropertyInfo ,
#endif
constructPreferencesFontButtonTitle ,
getPreferencesFontButtonTitle ,
#if defined(ENABLE_OVERLOADING)
preferencesFontButtonTitle ,
#endif
PreferencesFontButtonActivateCallback ,
#if defined(ENABLE_OVERLOADING)
PreferencesFontButtonActivateSignalInfo ,
#endif
afterPreferencesFontButtonActivate ,
onPreferencesFontButtonActivate ,
) where
import Data.GI.Base.ShortPrelude
import qualified Data.GI.Base.ShortPrelude as SP
import qualified Data.GI.Base.Overloading as O
import qualified Prelude as P
import qualified Data.GI.Base.Attributes as GI.Attributes
import qualified Data.GI.Base.BasicTypes as B.Types
import qualified Data.GI.Base.ManagedPtr as B.ManagedPtr
import qualified Data.GI.Base.GArray as B.GArray
import qualified Data.GI.Base.GClosure as B.GClosure
import qualified Data.GI.Base.GError as B.GError
import qualified Data.GI.Base.GHashTable as B.GHT
import qualified Data.GI.Base.GVariant as B.GVariant
import qualified Data.GI.Base.GValue as B.GValue
import qualified Data.GI.Base.GParamSpec as B.GParamSpec
import qualified Data.GI.Base.CallStack as B.CallStack
import qualified Data.GI.Base.Properties as B.Properties
import qualified Data.GI.Base.Signals as B.Signals
import qualified Control.Monad.IO.Class as MIO
import qualified Data.Coerce as Coerce
import qualified Data.Text as T
import qualified Data.Kind as DK
import qualified Data.ByteString.Char8 as B
import qualified Data.Map as Map
import qualified Foreign.Ptr as FP
import qualified GHC.OverloadedLabels as OL
import qualified GHC.Records as R
import qualified Data.Word as DW
import qualified Data.Int as DI
import qualified System.Posix.Types as SPT
import qualified Foreign.C.Types as FCT
#if MIN_VERSION_base(4,18,0)
import qualified GI.Atk.Interfaces.ImplementorIface as Atk.ImplementorIface
import {-# SOURCE #-} qualified GI.Dazzle.Objects.PreferencesBin as Dazzle.PreferencesBin
import qualified GI.GObject.Objects.Object as GObject.Object
import qualified GI.Gtk.Interfaces.Buildable as Gtk.Buildable
import qualified GI.Gtk.Objects.Bin as Gtk.Bin
import qualified GI.Gtk.Objects.Container as Gtk.Container
import qualified GI.Gtk.Objects.Widget as Gtk.Widget
#else
import qualified GI.Atk.Interfaces.ImplementorIface as Atk.ImplementorIface
import {-# SOURCE #-} qualified GI.Dazzle.Objects.PreferencesBin as Dazzle.PreferencesBin
import qualified GI.GObject.Objects.Object as GObject.Object
import qualified GI.Gtk.Interfaces.Buildable as Gtk.Buildable
import qualified GI.Gtk.Objects.Bin as Gtk.Bin
import qualified GI.Gtk.Objects.Container as Gtk.Container
import qualified GI.Gtk.Objects.Widget as Gtk.Widget
#endif
newtype PreferencesFontButton = PreferencesFontButton (SP.ManagedPtr PreferencesFontButton)
deriving (PreferencesFontButton -> PreferencesFontButton -> Bool
(PreferencesFontButton -> PreferencesFontButton -> Bool)
-> (PreferencesFontButton -> PreferencesFontButton -> Bool)
-> Eq PreferencesFontButton
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: PreferencesFontButton -> PreferencesFontButton -> Bool
== :: PreferencesFontButton -> PreferencesFontButton -> Bool
$c/= :: PreferencesFontButton -> PreferencesFontButton -> Bool
/= :: PreferencesFontButton -> PreferencesFontButton -> Bool
Eq)
instance SP.ManagedPtrNewtype PreferencesFontButton where
toManagedPtr :: PreferencesFontButton -> ManagedPtr PreferencesFontButton
toManagedPtr (PreferencesFontButton ManagedPtr PreferencesFontButton
p) = ManagedPtr PreferencesFontButton
p
foreign import ccall "dzl_preferences_font_button_get_type"
c_dzl_preferences_font_button_get_type :: IO B.Types.GType
instance B.Types.TypedObject PreferencesFontButton where
glibType :: IO GType
glibType = IO GType
c_dzl_preferences_font_button_get_type
instance B.Types.GObject PreferencesFontButton
class (SP.GObject o, O.IsDescendantOf PreferencesFontButton o) => IsPreferencesFontButton o
instance (SP.GObject o, O.IsDescendantOf PreferencesFontButton o) => IsPreferencesFontButton o
instance O.HasParentTypes PreferencesFontButton
type instance O.ParentTypes PreferencesFontButton = '[Dazzle.PreferencesBin.PreferencesBin, Gtk.Bin.Bin, Gtk.Container.Container, Gtk.Widget.Widget, GObject.Object.Object, Atk.ImplementorIface.ImplementorIface, Gtk.Buildable.Buildable]
toPreferencesFontButton :: (MIO.MonadIO m, IsPreferencesFontButton o) => o -> m PreferencesFontButton
toPreferencesFontButton :: forall (m :: * -> *) o.
(MonadIO m, IsPreferencesFontButton o) =>
o -> m PreferencesFontButton
toPreferencesFontButton = IO PreferencesFontButton -> m PreferencesFontButton
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO PreferencesFontButton -> m PreferencesFontButton)
-> (o -> IO PreferencesFontButton) -> o -> m PreferencesFontButton
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (ManagedPtr PreferencesFontButton -> PreferencesFontButton)
-> o -> IO PreferencesFontButton
forall o o'.
(HasCallStack, ManagedPtrNewtype o, TypedObject o,
ManagedPtrNewtype o', TypedObject o') =>
(ManagedPtr o' -> o') -> o -> IO o'
B.ManagedPtr.unsafeCastTo ManagedPtr PreferencesFontButton -> PreferencesFontButton
PreferencesFontButton
instance B.GValue.IsGValue (Maybe PreferencesFontButton) where
gvalueGType_ :: IO GType
gvalueGType_ = IO GType
c_dzl_preferences_font_button_get_type
gvalueSet_ :: Ptr GValue -> Maybe PreferencesFontButton -> IO ()
gvalueSet_ Ptr GValue
gv Maybe PreferencesFontButton
P.Nothing = Ptr GValue -> Ptr PreferencesFontButton -> IO ()
forall a. GObject a => Ptr GValue -> Ptr a -> IO ()
B.GValue.set_object Ptr GValue
gv (Ptr PreferencesFontButton
forall a. Ptr a
FP.nullPtr :: FP.Ptr PreferencesFontButton)
gvalueSet_ Ptr GValue
gv (P.Just PreferencesFontButton
obj) = PreferencesFontButton
-> (Ptr PreferencesFontButton -> IO ()) -> IO ()
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
B.ManagedPtr.withManagedPtr PreferencesFontButton
obj (Ptr GValue -> Ptr PreferencesFontButton -> IO ()
forall a. GObject a => Ptr GValue -> Ptr a -> IO ()
B.GValue.set_object Ptr GValue
gv)
gvalueGet_ :: Ptr GValue -> IO (Maybe PreferencesFontButton)
gvalueGet_ Ptr GValue
gv = do
Ptr PreferencesFontButton
ptr <- Ptr GValue -> IO (Ptr PreferencesFontButton)
forall a. GObject a => Ptr GValue -> IO (Ptr a)
B.GValue.get_object Ptr GValue
gv :: IO (FP.Ptr PreferencesFontButton)
if Ptr PreferencesFontButton
ptr Ptr PreferencesFontButton -> Ptr PreferencesFontButton -> Bool
forall a. Eq a => a -> a -> Bool
/= Ptr PreferencesFontButton
forall a. Ptr a
FP.nullPtr
then PreferencesFontButton -> Maybe PreferencesFontButton
forall a. a -> Maybe a
P.Just (PreferencesFontButton -> Maybe PreferencesFontButton)
-> IO PreferencesFontButton -> IO (Maybe PreferencesFontButton)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (ManagedPtr PreferencesFontButton -> PreferencesFontButton)
-> Ptr PreferencesFontButton -> IO PreferencesFontButton
forall a b.
(HasCallStack, GObject a, GObject b) =>
(ManagedPtr a -> a) -> Ptr b -> IO a
B.ManagedPtr.newObject ManagedPtr PreferencesFontButton -> PreferencesFontButton
PreferencesFontButton Ptr PreferencesFontButton
ptr
else Maybe PreferencesFontButton -> IO (Maybe PreferencesFontButton)
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return Maybe PreferencesFontButton
forall a. Maybe a
P.Nothing
#if defined(ENABLE_OVERLOADING)
type family ResolvePreferencesFontButtonMethod (t :: Symbol) (o :: DK.Type) :: DK.Type where
ResolvePreferencesFontButtonMethod "activate" o = Gtk.Widget.WidgetActivateMethodInfo
ResolvePreferencesFontButtonMethod "add" o = Gtk.Container.ContainerAddMethodInfo
ResolvePreferencesFontButtonMethod "addAccelerator" o = Gtk.Widget.WidgetAddAcceleratorMethodInfo
ResolvePreferencesFontButtonMethod "addChild" o = Gtk.Buildable.BuildableAddChildMethodInfo
ResolvePreferencesFontButtonMethod "addDeviceEvents" o = Gtk.Widget.WidgetAddDeviceEventsMethodInfo
ResolvePreferencesFontButtonMethod "addEvents" o = Gtk.Widget.WidgetAddEventsMethodInfo
ResolvePreferencesFontButtonMethod "addMnemonicLabel" o = Gtk.Widget.WidgetAddMnemonicLabelMethodInfo
ResolvePreferencesFontButtonMethod "addTickCallback" o = Gtk.Widget.WidgetAddTickCallbackMethodInfo
ResolvePreferencesFontButtonMethod "bindProperty" o = GObject.Object.ObjectBindPropertyMethodInfo
ResolvePreferencesFontButtonMethod "bindPropertyFull" o = GObject.Object.ObjectBindPropertyFullMethodInfo
ResolvePreferencesFontButtonMethod "canActivateAccel" o = Gtk.Widget.WidgetCanActivateAccelMethodInfo
ResolvePreferencesFontButtonMethod "checkResize" o = Gtk.Container.ContainerCheckResizeMethodInfo
ResolvePreferencesFontButtonMethod "childFocus" o = Gtk.Widget.WidgetChildFocusMethodInfo
ResolvePreferencesFontButtonMethod "childGetProperty" o = Gtk.Container.ContainerChildGetPropertyMethodInfo
ResolvePreferencesFontButtonMethod "childNotify" o = Gtk.Container.ContainerChildNotifyMethodInfo
ResolvePreferencesFontButtonMethod "childNotifyByPspec" o = Gtk.Container.ContainerChildNotifyByPspecMethodInfo
ResolvePreferencesFontButtonMethod "childSetProperty" o = Gtk.Container.ContainerChildSetPropertyMethodInfo
ResolvePreferencesFontButtonMethod "childType" o = Gtk.Container.ContainerChildTypeMethodInfo
ResolvePreferencesFontButtonMethod "classPath" o = Gtk.Widget.WidgetClassPathMethodInfo
ResolvePreferencesFontButtonMethod "computeExpand" o = Gtk.Widget.WidgetComputeExpandMethodInfo
ResolvePreferencesFontButtonMethod "constructChild" o = Gtk.Buildable.BuildableConstructChildMethodInfo
ResolvePreferencesFontButtonMethod "createPangoContext" o = Gtk.Widget.WidgetCreatePangoContextMethodInfo
ResolvePreferencesFontButtonMethod "createPangoLayout" o = Gtk.Widget.WidgetCreatePangoLayoutMethodInfo
ResolvePreferencesFontButtonMethod "customFinished" o = Gtk.Buildable.BuildableCustomFinishedMethodInfo
ResolvePreferencesFontButtonMethod "customTagEnd" o = Gtk.Buildable.BuildableCustomTagEndMethodInfo
ResolvePreferencesFontButtonMethod "customTagStart" o = Gtk.Buildable.BuildableCustomTagStartMethodInfo
ResolvePreferencesFontButtonMethod "destroy" o = Gtk.Widget.WidgetDestroyMethodInfo
ResolvePreferencesFontButtonMethod "destroyed" o = Gtk.Widget.WidgetDestroyedMethodInfo
ResolvePreferencesFontButtonMethod "deviceIsShadowed" o = Gtk.Widget.WidgetDeviceIsShadowedMethodInfo
ResolvePreferencesFontButtonMethod "dragBegin" o = Gtk.Widget.WidgetDragBeginMethodInfo
ResolvePreferencesFontButtonMethod "dragBeginWithCoordinates" o = Gtk.Widget.WidgetDragBeginWithCoordinatesMethodInfo
ResolvePreferencesFontButtonMethod "dragCheckThreshold" o = Gtk.Widget.WidgetDragCheckThresholdMethodInfo
ResolvePreferencesFontButtonMethod "dragDestAddImageTargets" o = Gtk.Widget.WidgetDragDestAddImageTargetsMethodInfo
ResolvePreferencesFontButtonMethod "dragDestAddTextTargets" o = Gtk.Widget.WidgetDragDestAddTextTargetsMethodInfo
ResolvePreferencesFontButtonMethod "dragDestAddUriTargets" o = Gtk.Widget.WidgetDragDestAddUriTargetsMethodInfo
ResolvePreferencesFontButtonMethod "dragDestFindTarget" o = Gtk.Widget.WidgetDragDestFindTargetMethodInfo
ResolvePreferencesFontButtonMethod "dragDestGetTargetList" o = Gtk.Widget.WidgetDragDestGetTargetListMethodInfo
ResolvePreferencesFontButtonMethod "dragDestGetTrackMotion" o = Gtk.Widget.WidgetDragDestGetTrackMotionMethodInfo
ResolvePreferencesFontButtonMethod "dragDestSet" o = Gtk.Widget.WidgetDragDestSetMethodInfo
ResolvePreferencesFontButtonMethod "dragDestSetProxy" o = Gtk.Widget.WidgetDragDestSetProxyMethodInfo
ResolvePreferencesFontButtonMethod "dragDestSetTargetList" o = Gtk.Widget.WidgetDragDestSetTargetListMethodInfo
ResolvePreferencesFontButtonMethod "dragDestSetTrackMotion" o = Gtk.Widget.WidgetDragDestSetTrackMotionMethodInfo
ResolvePreferencesFontButtonMethod "dragDestUnset" o = Gtk.Widget.WidgetDragDestUnsetMethodInfo
ResolvePreferencesFontButtonMethod "dragGetData" o = Gtk.Widget.WidgetDragGetDataMethodInfo
ResolvePreferencesFontButtonMethod "dragHighlight" o = Gtk.Widget.WidgetDragHighlightMethodInfo
ResolvePreferencesFontButtonMethod "dragSourceAddImageTargets" o = Gtk.Widget.WidgetDragSourceAddImageTargetsMethodInfo
ResolvePreferencesFontButtonMethod "dragSourceAddTextTargets" o = Gtk.Widget.WidgetDragSourceAddTextTargetsMethodInfo
ResolvePreferencesFontButtonMethod "dragSourceAddUriTargets" o = Gtk.Widget.WidgetDragSourceAddUriTargetsMethodInfo
ResolvePreferencesFontButtonMethod "dragSourceGetTargetList" o = Gtk.Widget.WidgetDragSourceGetTargetListMethodInfo
ResolvePreferencesFontButtonMethod "dragSourceSet" o = Gtk.Widget.WidgetDragSourceSetMethodInfo
ResolvePreferencesFontButtonMethod "dragSourceSetIconGicon" o = Gtk.Widget.WidgetDragSourceSetIconGiconMethodInfo
ResolvePreferencesFontButtonMethod "dragSourceSetIconName" o = Gtk.Widget.WidgetDragSourceSetIconNameMethodInfo
ResolvePreferencesFontButtonMethod "dragSourceSetIconPixbuf" o = Gtk.Widget.WidgetDragSourceSetIconPixbufMethodInfo
ResolvePreferencesFontButtonMethod "dragSourceSetIconStock" o = Gtk.Widget.WidgetDragSourceSetIconStockMethodInfo
ResolvePreferencesFontButtonMethod "dragSourceSetTargetList" o = Gtk.Widget.WidgetDragSourceSetTargetListMethodInfo
ResolvePreferencesFontButtonMethod "dragSourceUnset" o = Gtk.Widget.WidgetDragSourceUnsetMethodInfo
ResolvePreferencesFontButtonMethod "dragUnhighlight" o = Gtk.Widget.WidgetDragUnhighlightMethodInfo
ResolvePreferencesFontButtonMethod "draw" o = Gtk.Widget.WidgetDrawMethodInfo
ResolvePreferencesFontButtonMethod "ensureStyle" o = Gtk.Widget.WidgetEnsureStyleMethodInfo
ResolvePreferencesFontButtonMethod "errorBell" o = Gtk.Widget.WidgetErrorBellMethodInfo
ResolvePreferencesFontButtonMethod "event" o = Gtk.Widget.WidgetEventMethodInfo
ResolvePreferencesFontButtonMethod "forall" o = Gtk.Container.ContainerForallMethodInfo
ResolvePreferencesFontButtonMethod "forceFloating" o = GObject.Object.ObjectForceFloatingMethodInfo
ResolvePreferencesFontButtonMethod "foreach" o = Gtk.Container.ContainerForeachMethodInfo
ResolvePreferencesFontButtonMethod "freezeChildNotify" o = Gtk.Widget.WidgetFreezeChildNotifyMethodInfo
ResolvePreferencesFontButtonMethod "freezeNotify" o = GObject.Object.ObjectFreezeNotifyMethodInfo
ResolvePreferencesFontButtonMethod "getv" o = GObject.Object.ObjectGetvMethodInfo
ResolvePreferencesFontButtonMethod "grabAdd" o = Gtk.Widget.WidgetGrabAddMethodInfo
ResolvePreferencesFontButtonMethod "grabDefault" o = Gtk.Widget.WidgetGrabDefaultMethodInfo
ResolvePreferencesFontButtonMethod "grabFocus" o = Gtk.Widget.WidgetGrabFocusMethodInfo
ResolvePreferencesFontButtonMethod "grabRemove" o = Gtk.Widget.WidgetGrabRemoveMethodInfo
ResolvePreferencesFontButtonMethod "hasDefault" o = Gtk.Widget.WidgetHasDefaultMethodInfo
ResolvePreferencesFontButtonMethod "hasFocus" o = Gtk.Widget.WidgetHasFocusMethodInfo
ResolvePreferencesFontButtonMethod "hasGrab" o = Gtk.Widget.WidgetHasGrabMethodInfo
ResolvePreferencesFontButtonMethod "hasRcStyle" o = Gtk.Widget.WidgetHasRcStyleMethodInfo
ResolvePreferencesFontButtonMethod "hasScreen" o = Gtk.Widget.WidgetHasScreenMethodInfo
ResolvePreferencesFontButtonMethod "hasVisibleFocus" o = Gtk.Widget.WidgetHasVisibleFocusMethodInfo
ResolvePreferencesFontButtonMethod "hide" o = Gtk.Widget.WidgetHideMethodInfo
ResolvePreferencesFontButtonMethod "hideOnDelete" o = Gtk.Widget.WidgetHideOnDeleteMethodInfo
ResolvePreferencesFontButtonMethod "inDestruction" o = Gtk.Widget.WidgetInDestructionMethodInfo
ResolvePreferencesFontButtonMethod "initTemplate" o = Gtk.Widget.WidgetInitTemplateMethodInfo
ResolvePreferencesFontButtonMethod "inputShapeCombineRegion" o = Gtk.Widget.WidgetInputShapeCombineRegionMethodInfo
ResolvePreferencesFontButtonMethod "insertActionGroup" o = Gtk.Widget.WidgetInsertActionGroupMethodInfo
ResolvePreferencesFontButtonMethod "intersect" o = Gtk.Widget.WidgetIntersectMethodInfo
ResolvePreferencesFontButtonMethod "isAncestor" o = Gtk.Widget.WidgetIsAncestorMethodInfo
ResolvePreferencesFontButtonMethod "isComposited" o = Gtk.Widget.WidgetIsCompositedMethodInfo
ResolvePreferencesFontButtonMethod "isDrawable" o = Gtk.Widget.WidgetIsDrawableMethodInfo
ResolvePreferencesFontButtonMethod "isFloating" o = GObject.Object.ObjectIsFloatingMethodInfo
ResolvePreferencesFontButtonMethod "isFocus" o = Gtk.Widget.WidgetIsFocusMethodInfo
ResolvePreferencesFontButtonMethod "isSensitive" o = Gtk.Widget.WidgetIsSensitiveMethodInfo
ResolvePreferencesFontButtonMethod "isToplevel" o = Gtk.Widget.WidgetIsToplevelMethodInfo
ResolvePreferencesFontButtonMethod "isVisible" o = Gtk.Widget.WidgetIsVisibleMethodInfo
ResolvePreferencesFontButtonMethod "keynavFailed" o = Gtk.Widget.WidgetKeynavFailedMethodInfo
ResolvePreferencesFontButtonMethod "listAccelClosures" o = Gtk.Widget.WidgetListAccelClosuresMethodInfo
ResolvePreferencesFontButtonMethod "listActionPrefixes" o = Gtk.Widget.WidgetListActionPrefixesMethodInfo
ResolvePreferencesFontButtonMethod "listMnemonicLabels" o = Gtk.Widget.WidgetListMnemonicLabelsMethodInfo
ResolvePreferencesFontButtonMethod "map" o = Gtk.Widget.WidgetMapMethodInfo
ResolvePreferencesFontButtonMethod "mnemonicActivate" o = Gtk.Widget.WidgetMnemonicActivateMethodInfo
ResolvePreferencesFontButtonMethod "modifyBase" o = Gtk.Widget.WidgetModifyBaseMethodInfo
ResolvePreferencesFontButtonMethod "modifyBg" o = Gtk.Widget.WidgetModifyBgMethodInfo
ResolvePreferencesFontButtonMethod "modifyCursor" o = Gtk.Widget.WidgetModifyCursorMethodInfo
ResolvePreferencesFontButtonMethod "modifyFg" o = Gtk.Widget.WidgetModifyFgMethodInfo
ResolvePreferencesFontButtonMethod "modifyFont" o = Gtk.Widget.WidgetModifyFontMethodInfo
ResolvePreferencesFontButtonMethod "modifyStyle" o = Gtk.Widget.WidgetModifyStyleMethodInfo
ResolvePreferencesFontButtonMethod "modifyText" o = Gtk.Widget.WidgetModifyTextMethodInfo
ResolvePreferencesFontButtonMethod "notify" o = GObject.Object.ObjectNotifyMethodInfo
ResolvePreferencesFontButtonMethod "notifyByPspec" o = GObject.Object.ObjectNotifyByPspecMethodInfo
ResolvePreferencesFontButtonMethod "overrideBackgroundColor" o = Gtk.Widget.WidgetOverrideBackgroundColorMethodInfo
ResolvePreferencesFontButtonMethod "overrideColor" o = Gtk.Widget.WidgetOverrideColorMethodInfo
ResolvePreferencesFontButtonMethod "overrideCursor" o = Gtk.Widget.WidgetOverrideCursorMethodInfo
ResolvePreferencesFontButtonMethod "overrideFont" o = Gtk.Widget.WidgetOverrideFontMethodInfo
ResolvePreferencesFontButtonMethod "overrideSymbolicColor" o = Gtk.Widget.WidgetOverrideSymbolicColorMethodInfo
ResolvePreferencesFontButtonMethod "parserFinished" o = Gtk.Buildable.BuildableParserFinishedMethodInfo
ResolvePreferencesFontButtonMethod "path" o = Gtk.Widget.WidgetPathMethodInfo
ResolvePreferencesFontButtonMethod "propagateDraw" o = Gtk.Container.ContainerPropagateDrawMethodInfo
ResolvePreferencesFontButtonMethod "queueAllocate" o = Gtk.Widget.WidgetQueueAllocateMethodInfo
ResolvePreferencesFontButtonMethod "queueComputeExpand" o = Gtk.Widget.WidgetQueueComputeExpandMethodInfo
ResolvePreferencesFontButtonMethod "queueDraw" o = Gtk.Widget.WidgetQueueDrawMethodInfo
ResolvePreferencesFontButtonMethod "queueDrawArea" o = Gtk.Widget.WidgetQueueDrawAreaMethodInfo
ResolvePreferencesFontButtonMethod "queueDrawRegion" o = Gtk.Widget.WidgetQueueDrawRegionMethodInfo
ResolvePreferencesFontButtonMethod "queueResize" o = Gtk.Widget.WidgetQueueResizeMethodInfo
ResolvePreferencesFontButtonMethod "queueResizeNoRedraw" o = Gtk.Widget.WidgetQueueResizeNoRedrawMethodInfo
ResolvePreferencesFontButtonMethod "realize" o = Gtk.Widget.WidgetRealizeMethodInfo
ResolvePreferencesFontButtonMethod "ref" o = GObject.Object.ObjectRefMethodInfo
ResolvePreferencesFontButtonMethod "refSink" o = GObject.Object.ObjectRefSinkMethodInfo
ResolvePreferencesFontButtonMethod "regionIntersect" o = Gtk.Widget.WidgetRegionIntersectMethodInfo
ResolvePreferencesFontButtonMethod "registerWindow" o = Gtk.Widget.WidgetRegisterWindowMethodInfo
ResolvePreferencesFontButtonMethod "remove" o = Gtk.Container.ContainerRemoveMethodInfo
ResolvePreferencesFontButtonMethod "removeAccelerator" o = Gtk.Widget.WidgetRemoveAcceleratorMethodInfo
ResolvePreferencesFontButtonMethod "removeMnemonicLabel" o = Gtk.Widget.WidgetRemoveMnemonicLabelMethodInfo
ResolvePreferencesFontButtonMethod "removeTickCallback" o = Gtk.Widget.WidgetRemoveTickCallbackMethodInfo
ResolvePreferencesFontButtonMethod "renderIcon" o = Gtk.Widget.WidgetRenderIconMethodInfo
ResolvePreferencesFontButtonMethod "renderIconPixbuf" o = Gtk.Widget.WidgetRenderIconPixbufMethodInfo
ResolvePreferencesFontButtonMethod "reparent" o = Gtk.Widget.WidgetReparentMethodInfo
ResolvePreferencesFontButtonMethod "resetRcStyles" o = Gtk.Widget.WidgetResetRcStylesMethodInfo
ResolvePreferencesFontButtonMethod "resetStyle" o = Gtk.Widget.WidgetResetStyleMethodInfo
ResolvePreferencesFontButtonMethod "resizeChildren" o = Gtk.Container.ContainerResizeChildrenMethodInfo
ResolvePreferencesFontButtonMethod "runDispose" o = GObject.Object.ObjectRunDisposeMethodInfo
ResolvePreferencesFontButtonMethod "sendExpose" o = Gtk.Widget.WidgetSendExposeMethodInfo
ResolvePreferencesFontButtonMethod "sendFocusChange" o = Gtk.Widget.WidgetSendFocusChangeMethodInfo
ResolvePreferencesFontButtonMethod "shapeCombineRegion" o = Gtk.Widget.WidgetShapeCombineRegionMethodInfo
ResolvePreferencesFontButtonMethod "show" o = Gtk.Widget.WidgetShowMethodInfo
ResolvePreferencesFontButtonMethod "showAll" o = Gtk.Widget.WidgetShowAllMethodInfo
ResolvePreferencesFontButtonMethod "showNow" o = Gtk.Widget.WidgetShowNowMethodInfo
ResolvePreferencesFontButtonMethod "sizeAllocate" o = Gtk.Widget.WidgetSizeAllocateMethodInfo
ResolvePreferencesFontButtonMethod "sizeAllocateWithBaseline" o = Gtk.Widget.WidgetSizeAllocateWithBaselineMethodInfo
ResolvePreferencesFontButtonMethod "sizeRequest" o = Gtk.Widget.WidgetSizeRequestMethodInfo
ResolvePreferencesFontButtonMethod "stealData" o = GObject.Object.ObjectStealDataMethodInfo
ResolvePreferencesFontButtonMethod "stealQdata" o = GObject.Object.ObjectStealQdataMethodInfo
ResolvePreferencesFontButtonMethod "styleAttach" o = Gtk.Widget.WidgetStyleAttachMethodInfo
ResolvePreferencesFontButtonMethod "styleGetProperty" o = Gtk.Widget.WidgetStyleGetPropertyMethodInfo
ResolvePreferencesFontButtonMethod "thawChildNotify" o = Gtk.Widget.WidgetThawChildNotifyMethodInfo
ResolvePreferencesFontButtonMethod "thawNotify" o = GObject.Object.ObjectThawNotifyMethodInfo
ResolvePreferencesFontButtonMethod "translateCoordinates" o = Gtk.Widget.WidgetTranslateCoordinatesMethodInfo
ResolvePreferencesFontButtonMethod "triggerTooltipQuery" o = Gtk.Widget.WidgetTriggerTooltipQueryMethodInfo
ResolvePreferencesFontButtonMethod "unmap" o = Gtk.Widget.WidgetUnmapMethodInfo
ResolvePreferencesFontButtonMethod "unparent" o = Gtk.Widget.WidgetUnparentMethodInfo
ResolvePreferencesFontButtonMethod "unrealize" o = Gtk.Widget.WidgetUnrealizeMethodInfo
ResolvePreferencesFontButtonMethod "unref" o = GObject.Object.ObjectUnrefMethodInfo
ResolvePreferencesFontButtonMethod "unregisterWindow" o = Gtk.Widget.WidgetUnregisterWindowMethodInfo
ResolvePreferencesFontButtonMethod "unsetFocusChain" o = Gtk.Container.ContainerUnsetFocusChainMethodInfo
ResolvePreferencesFontButtonMethod "unsetStateFlags" o = Gtk.Widget.WidgetUnsetStateFlagsMethodInfo
ResolvePreferencesFontButtonMethod "watchClosure" o = GObject.Object.ObjectWatchClosureMethodInfo
ResolvePreferencesFontButtonMethod "getAccessible" o = Gtk.Widget.WidgetGetAccessibleMethodInfo
ResolvePreferencesFontButtonMethod "getActionGroup" o = Gtk.Widget.WidgetGetActionGroupMethodInfo
ResolvePreferencesFontButtonMethod "getAllocatedBaseline" o = Gtk.Widget.WidgetGetAllocatedBaselineMethodInfo
ResolvePreferencesFontButtonMethod "getAllocatedHeight" o = Gtk.Widget.WidgetGetAllocatedHeightMethodInfo
ResolvePreferencesFontButtonMethod "getAllocatedSize" o = Gtk.Widget.WidgetGetAllocatedSizeMethodInfo
ResolvePreferencesFontButtonMethod "getAllocatedWidth" o = Gtk.Widget.WidgetGetAllocatedWidthMethodInfo
ResolvePreferencesFontButtonMethod "getAllocation" o = Gtk.Widget.WidgetGetAllocationMethodInfo
ResolvePreferencesFontButtonMethod "getAncestor" o = Gtk.Widget.WidgetGetAncestorMethodInfo
ResolvePreferencesFontButtonMethod "getAppPaintable" o = Gtk.Widget.WidgetGetAppPaintableMethodInfo
ResolvePreferencesFontButtonMethod "getBorderWidth" o = Gtk.Container.ContainerGetBorderWidthMethodInfo
ResolvePreferencesFontButtonMethod "getCanDefault" o = Gtk.Widget.WidgetGetCanDefaultMethodInfo
ResolvePreferencesFontButtonMethod "getCanFocus" o = Gtk.Widget.WidgetGetCanFocusMethodInfo
ResolvePreferencesFontButtonMethod "getChild" o = Gtk.Bin.BinGetChildMethodInfo
ResolvePreferencesFontButtonMethod "getChildRequisition" o = Gtk.Widget.WidgetGetChildRequisitionMethodInfo
ResolvePreferencesFontButtonMethod "getChildVisible" o = Gtk.Widget.WidgetGetChildVisibleMethodInfo
ResolvePreferencesFontButtonMethod "getChildren" o = Gtk.Container.ContainerGetChildrenMethodInfo
ResolvePreferencesFontButtonMethod "getClip" o = Gtk.Widget.WidgetGetClipMethodInfo
ResolvePreferencesFontButtonMethod "getClipboard" o = Gtk.Widget.WidgetGetClipboardMethodInfo
ResolvePreferencesFontButtonMethod "getCompositeName" o = Gtk.Widget.WidgetGetCompositeNameMethodInfo
ResolvePreferencesFontButtonMethod "getData" o = GObject.Object.ObjectGetDataMethodInfo
ResolvePreferencesFontButtonMethod "getDeviceEnabled" o = Gtk.Widget.WidgetGetDeviceEnabledMethodInfo
ResolvePreferencesFontButtonMethod "getDeviceEvents" o = Gtk.Widget.WidgetGetDeviceEventsMethodInfo
ResolvePreferencesFontButtonMethod "getDirection" o = Gtk.Widget.WidgetGetDirectionMethodInfo
ResolvePreferencesFontButtonMethod "getDisplay" o = Gtk.Widget.WidgetGetDisplayMethodInfo
ResolvePreferencesFontButtonMethod "getDoubleBuffered" o = Gtk.Widget.WidgetGetDoubleBufferedMethodInfo
ResolvePreferencesFontButtonMethod "getEvents" o = Gtk.Widget.WidgetGetEventsMethodInfo
ResolvePreferencesFontButtonMethod "getFocusChain" o = Gtk.Container.ContainerGetFocusChainMethodInfo
ResolvePreferencesFontButtonMethod "getFocusChild" o = Gtk.Container.ContainerGetFocusChildMethodInfo
ResolvePreferencesFontButtonMethod "getFocusHadjustment" o = Gtk.Container.ContainerGetFocusHadjustmentMethodInfo
ResolvePreferencesFontButtonMethod "getFocusOnClick" o = Gtk.Widget.WidgetGetFocusOnClickMethodInfo
ResolvePreferencesFontButtonMethod "getFocusVadjustment" o = Gtk.Container.ContainerGetFocusVadjustmentMethodInfo
ResolvePreferencesFontButtonMethod "getFontMap" o = Gtk.Widget.WidgetGetFontMapMethodInfo
ResolvePreferencesFontButtonMethod "getFontOptions" o = Gtk.Widget.WidgetGetFontOptionsMethodInfo
ResolvePreferencesFontButtonMethod "getFrameClock" o = Gtk.Widget.WidgetGetFrameClockMethodInfo
ResolvePreferencesFontButtonMethod "getHalign" o = Gtk.Widget.WidgetGetHalignMethodInfo
ResolvePreferencesFontButtonMethod "getHasTooltip" o = Gtk.Widget.WidgetGetHasTooltipMethodInfo
ResolvePreferencesFontButtonMethod "getHasWindow" o = Gtk.Widget.WidgetGetHasWindowMethodInfo
ResolvePreferencesFontButtonMethod "getHexpand" o = Gtk.Widget.WidgetGetHexpandMethodInfo
ResolvePreferencesFontButtonMethod "getHexpandSet" o = Gtk.Widget.WidgetGetHexpandSetMethodInfo
ResolvePreferencesFontButtonMethod "getInternalChild" o = Gtk.Buildable.BuildableGetInternalChildMethodInfo
ResolvePreferencesFontButtonMethod "getMapped" o = Gtk.Widget.WidgetGetMappedMethodInfo
ResolvePreferencesFontButtonMethod "getMarginBottom" o = Gtk.Widget.WidgetGetMarginBottomMethodInfo
ResolvePreferencesFontButtonMethod "getMarginEnd" o = Gtk.Widget.WidgetGetMarginEndMethodInfo
ResolvePreferencesFontButtonMethod "getMarginLeft" o = Gtk.Widget.WidgetGetMarginLeftMethodInfo
ResolvePreferencesFontButtonMethod "getMarginRight" o = Gtk.Widget.WidgetGetMarginRightMethodInfo
ResolvePreferencesFontButtonMethod "getMarginStart" o = Gtk.Widget.WidgetGetMarginStartMethodInfo
ResolvePreferencesFontButtonMethod "getMarginTop" o = Gtk.Widget.WidgetGetMarginTopMethodInfo
ResolvePreferencesFontButtonMethod "getModifierMask" o = Gtk.Widget.WidgetGetModifierMaskMethodInfo
ResolvePreferencesFontButtonMethod "getModifierStyle" o = Gtk.Widget.WidgetGetModifierStyleMethodInfo
ResolvePreferencesFontButtonMethod "getName" o = Gtk.Widget.WidgetGetNameMethodInfo
ResolvePreferencesFontButtonMethod "getNoShowAll" o = Gtk.Widget.WidgetGetNoShowAllMethodInfo
ResolvePreferencesFontButtonMethod "getOpacity" o = Gtk.Widget.WidgetGetOpacityMethodInfo
ResolvePreferencesFontButtonMethod "getPangoContext" o = Gtk.Widget.WidgetGetPangoContextMethodInfo
ResolvePreferencesFontButtonMethod "getParent" o = Gtk.Widget.WidgetGetParentMethodInfo
ResolvePreferencesFontButtonMethod "getParentWindow" o = Gtk.Widget.WidgetGetParentWindowMethodInfo
ResolvePreferencesFontButtonMethod "getPath" o = Gtk.Widget.WidgetGetPathMethodInfo
ResolvePreferencesFontButtonMethod "getPathForChild" o = Gtk.Container.ContainerGetPathForChildMethodInfo
ResolvePreferencesFontButtonMethod "getPointer" o = Gtk.Widget.WidgetGetPointerMethodInfo
ResolvePreferencesFontButtonMethod "getPreferredHeight" o = Gtk.Widget.WidgetGetPreferredHeightMethodInfo
ResolvePreferencesFontButtonMethod "getPreferredHeightAndBaselineForWidth" o = Gtk.Widget.WidgetGetPreferredHeightAndBaselineForWidthMethodInfo
ResolvePreferencesFontButtonMethod "getPreferredHeightForWidth" o = Gtk.Widget.WidgetGetPreferredHeightForWidthMethodInfo
ResolvePreferencesFontButtonMethod "getPreferredSize" o = Gtk.Widget.WidgetGetPreferredSizeMethodInfo
ResolvePreferencesFontButtonMethod "getPreferredWidth" o = Gtk.Widget.WidgetGetPreferredWidthMethodInfo
ResolvePreferencesFontButtonMethod "getPreferredWidthForHeight" o = Gtk.Widget.WidgetGetPreferredWidthForHeightMethodInfo
ResolvePreferencesFontButtonMethod "getProperty" o = GObject.Object.ObjectGetPropertyMethodInfo
ResolvePreferencesFontButtonMethod "getQdata" o = GObject.Object.ObjectGetQdataMethodInfo
ResolvePreferencesFontButtonMethod "getRealized" o = Gtk.Widget.WidgetGetRealizedMethodInfo
ResolvePreferencesFontButtonMethod "getReceivesDefault" o = Gtk.Widget.WidgetGetReceivesDefaultMethodInfo
ResolvePreferencesFontButtonMethod "getRequestMode" o = Gtk.Widget.WidgetGetRequestModeMethodInfo
ResolvePreferencesFontButtonMethod "getRequisition" o = Gtk.Widget.WidgetGetRequisitionMethodInfo
ResolvePreferencesFontButtonMethod "getResizeMode" o = Gtk.Container.ContainerGetResizeModeMethodInfo
ResolvePreferencesFontButtonMethod "getRootWindow" o = Gtk.Widget.WidgetGetRootWindowMethodInfo
ResolvePreferencesFontButtonMethod "getScaleFactor" o = Gtk.Widget.WidgetGetScaleFactorMethodInfo
ResolvePreferencesFontButtonMethod "getScreen" o = Gtk.Widget.WidgetGetScreenMethodInfo
ResolvePreferencesFontButtonMethod "getSensitive" o = Gtk.Widget.WidgetGetSensitiveMethodInfo
ResolvePreferencesFontButtonMethod "getSettings" o = Gtk.Widget.WidgetGetSettingsMethodInfo
ResolvePreferencesFontButtonMethod "getSizeRequest" o = Gtk.Widget.WidgetGetSizeRequestMethodInfo
ResolvePreferencesFontButtonMethod "getState" o = Gtk.Widget.WidgetGetStateMethodInfo
ResolvePreferencesFontButtonMethod "getStateFlags" o = Gtk.Widget.WidgetGetStateFlagsMethodInfo
ResolvePreferencesFontButtonMethod "getStyle" o = Gtk.Widget.WidgetGetStyleMethodInfo
ResolvePreferencesFontButtonMethod "getStyleContext" o = Gtk.Widget.WidgetGetStyleContextMethodInfo
ResolvePreferencesFontButtonMethod "getSupportMultidevice" o = Gtk.Widget.WidgetGetSupportMultideviceMethodInfo
ResolvePreferencesFontButtonMethod "getTemplateChild" o = Gtk.Widget.WidgetGetTemplateChildMethodInfo
ResolvePreferencesFontButtonMethod "getTooltipMarkup" o = Gtk.Widget.WidgetGetTooltipMarkupMethodInfo
ResolvePreferencesFontButtonMethod "getTooltipText" o = Gtk.Widget.WidgetGetTooltipTextMethodInfo
ResolvePreferencesFontButtonMethod "getTooltipWindow" o = Gtk.Widget.WidgetGetTooltipWindowMethodInfo
ResolvePreferencesFontButtonMethod "getToplevel" o = Gtk.Widget.WidgetGetToplevelMethodInfo
ResolvePreferencesFontButtonMethod "getValign" o = Gtk.Widget.WidgetGetValignMethodInfo
ResolvePreferencesFontButtonMethod "getValignWithBaseline" o = Gtk.Widget.WidgetGetValignWithBaselineMethodInfo
ResolvePreferencesFontButtonMethod "getVexpand" o = Gtk.Widget.WidgetGetVexpandMethodInfo
ResolvePreferencesFontButtonMethod "getVexpandSet" o = Gtk.Widget.WidgetGetVexpandSetMethodInfo
ResolvePreferencesFontButtonMethod "getVisible" o = Gtk.Widget.WidgetGetVisibleMethodInfo
ResolvePreferencesFontButtonMethod "getVisual" o = Gtk.Widget.WidgetGetVisualMethodInfo
ResolvePreferencesFontButtonMethod "getWindow" o = Gtk.Widget.WidgetGetWindowMethodInfo
ResolvePreferencesFontButtonMethod "setAccelPath" o = Gtk.Widget.WidgetSetAccelPathMethodInfo
ResolvePreferencesFontButtonMethod "setAllocation" o = Gtk.Widget.WidgetSetAllocationMethodInfo
ResolvePreferencesFontButtonMethod "setAppPaintable" o = Gtk.Widget.WidgetSetAppPaintableMethodInfo
ResolvePreferencesFontButtonMethod "setBorderWidth" o = Gtk.Container.ContainerSetBorderWidthMethodInfo
ResolvePreferencesFontButtonMethod "setBuildableProperty" o = Gtk.Buildable.BuildableSetBuildablePropertyMethodInfo
ResolvePreferencesFontButtonMethod "setCanDefault" o = Gtk.Widget.WidgetSetCanDefaultMethodInfo
ResolvePreferencesFontButtonMethod "setCanFocus" o = Gtk.Widget.WidgetSetCanFocusMethodInfo
ResolvePreferencesFontButtonMethod "setChildVisible" o = Gtk.Widget.WidgetSetChildVisibleMethodInfo
ResolvePreferencesFontButtonMethod "setClip" o = Gtk.Widget.WidgetSetClipMethodInfo
ResolvePreferencesFontButtonMethod "setCompositeName" o = Gtk.Widget.WidgetSetCompositeNameMethodInfo
ResolvePreferencesFontButtonMethod "setData" o = GObject.Object.ObjectSetDataMethodInfo
ResolvePreferencesFontButtonMethod "setDataFull" o = GObject.Object.ObjectSetDataFullMethodInfo
ResolvePreferencesFontButtonMethod "setDeviceEnabled" o = Gtk.Widget.WidgetSetDeviceEnabledMethodInfo
ResolvePreferencesFontButtonMethod "setDeviceEvents" o = Gtk.Widget.WidgetSetDeviceEventsMethodInfo
ResolvePreferencesFontButtonMethod "setDirection" o = Gtk.Widget.WidgetSetDirectionMethodInfo
ResolvePreferencesFontButtonMethod "setDoubleBuffered" o = Gtk.Widget.WidgetSetDoubleBufferedMethodInfo
ResolvePreferencesFontButtonMethod "setEvents" o = Gtk.Widget.WidgetSetEventsMethodInfo
ResolvePreferencesFontButtonMethod "setFocusChain" o = Gtk.Container.ContainerSetFocusChainMethodInfo
ResolvePreferencesFontButtonMethod "setFocusChild" o = Gtk.Container.ContainerSetFocusChildMethodInfo
ResolvePreferencesFontButtonMethod "setFocusHadjustment" o = Gtk.Container.ContainerSetFocusHadjustmentMethodInfo
ResolvePreferencesFontButtonMethod "setFocusOnClick" o = Gtk.Widget.WidgetSetFocusOnClickMethodInfo
ResolvePreferencesFontButtonMethod "setFocusVadjustment" o = Gtk.Container.ContainerSetFocusVadjustmentMethodInfo
ResolvePreferencesFontButtonMethod "setFontMap" o = Gtk.Widget.WidgetSetFontMapMethodInfo
ResolvePreferencesFontButtonMethod "setFontOptions" o = Gtk.Widget.WidgetSetFontOptionsMethodInfo
ResolvePreferencesFontButtonMethod "setHalign" o = Gtk.Widget.WidgetSetHalignMethodInfo
ResolvePreferencesFontButtonMethod "setHasTooltip" o = Gtk.Widget.WidgetSetHasTooltipMethodInfo
ResolvePreferencesFontButtonMethod "setHasWindow" o = Gtk.Widget.WidgetSetHasWindowMethodInfo
ResolvePreferencesFontButtonMethod "setHexpand" o = Gtk.Widget.WidgetSetHexpandMethodInfo
ResolvePreferencesFontButtonMethod "setHexpandSet" o = Gtk.Widget.WidgetSetHexpandSetMethodInfo
ResolvePreferencesFontButtonMethod "setMapped" o = Gtk.Widget.WidgetSetMappedMethodInfo
ResolvePreferencesFontButtonMethod "setMarginBottom" o = Gtk.Widget.WidgetSetMarginBottomMethodInfo
ResolvePreferencesFontButtonMethod "setMarginEnd" o = Gtk.Widget.WidgetSetMarginEndMethodInfo
ResolvePreferencesFontButtonMethod "setMarginLeft" o = Gtk.Widget.WidgetSetMarginLeftMethodInfo
ResolvePreferencesFontButtonMethod "setMarginRight" o = Gtk.Widget.WidgetSetMarginRightMethodInfo
ResolvePreferencesFontButtonMethod "setMarginStart" o = Gtk.Widget.WidgetSetMarginStartMethodInfo
ResolvePreferencesFontButtonMethod "setMarginTop" o = Gtk.Widget.WidgetSetMarginTopMethodInfo
ResolvePreferencesFontButtonMethod "setName" o = Gtk.Widget.WidgetSetNameMethodInfo
ResolvePreferencesFontButtonMethod "setNoShowAll" o = Gtk.Widget.WidgetSetNoShowAllMethodInfo
ResolvePreferencesFontButtonMethod "setOpacity" o = Gtk.Widget.WidgetSetOpacityMethodInfo
ResolvePreferencesFontButtonMethod "setParent" o = Gtk.Widget.WidgetSetParentMethodInfo
ResolvePreferencesFontButtonMethod "setParentWindow" o = Gtk.Widget.WidgetSetParentWindowMethodInfo
ResolvePreferencesFontButtonMethod "setProperty" o = GObject.Object.ObjectSetPropertyMethodInfo
ResolvePreferencesFontButtonMethod "setRealized" o = Gtk.Widget.WidgetSetRealizedMethodInfo
ResolvePreferencesFontButtonMethod "setReallocateRedraws" o = Gtk.Container.ContainerSetReallocateRedrawsMethodInfo
ResolvePreferencesFontButtonMethod "setReceivesDefault" o = Gtk.Widget.WidgetSetReceivesDefaultMethodInfo
ResolvePreferencesFontButtonMethod "setRedrawOnAllocate" o = Gtk.Widget.WidgetSetRedrawOnAllocateMethodInfo
ResolvePreferencesFontButtonMethod "setResizeMode" o = Gtk.Container.ContainerSetResizeModeMethodInfo
ResolvePreferencesFontButtonMethod "setSensitive" o = Gtk.Widget.WidgetSetSensitiveMethodInfo
ResolvePreferencesFontButtonMethod "setSizeRequest" o = Gtk.Widget.WidgetSetSizeRequestMethodInfo
ResolvePreferencesFontButtonMethod "setState" o = Gtk.Widget.WidgetSetStateMethodInfo
ResolvePreferencesFontButtonMethod "setStateFlags" o = Gtk.Widget.WidgetSetStateFlagsMethodInfo
ResolvePreferencesFontButtonMethod "setStyle" o = Gtk.Widget.WidgetSetStyleMethodInfo
ResolvePreferencesFontButtonMethod "setSupportMultidevice" o = Gtk.Widget.WidgetSetSupportMultideviceMethodInfo
ResolvePreferencesFontButtonMethod "setTooltipMarkup" o = Gtk.Widget.WidgetSetTooltipMarkupMethodInfo
ResolvePreferencesFontButtonMethod "setTooltipText" o = Gtk.Widget.WidgetSetTooltipTextMethodInfo
ResolvePreferencesFontButtonMethod "setTooltipWindow" o = Gtk.Widget.WidgetSetTooltipWindowMethodInfo
ResolvePreferencesFontButtonMethod "setValign" o = Gtk.Widget.WidgetSetValignMethodInfo
ResolvePreferencesFontButtonMethod "setVexpand" o = Gtk.Widget.WidgetSetVexpandMethodInfo
ResolvePreferencesFontButtonMethod "setVexpandSet" o = Gtk.Widget.WidgetSetVexpandSetMethodInfo
ResolvePreferencesFontButtonMethod "setVisible" o = Gtk.Widget.WidgetSetVisibleMethodInfo
ResolvePreferencesFontButtonMethod "setVisual" o = Gtk.Widget.WidgetSetVisualMethodInfo
ResolvePreferencesFontButtonMethod "setWindow" o = Gtk.Widget.WidgetSetWindowMethodInfo
ResolvePreferencesFontButtonMethod l o = O.MethodResolutionFailed l o
instance (info ~ ResolvePreferencesFontButtonMethod t PreferencesFontButton, O.OverloadedMethod info PreferencesFontButton p) => OL.IsLabel t (PreferencesFontButton -> p) where
#if MIN_VERSION_base(4,10,0)
fromLabel = O.overloadedMethod @info
#else
fromLabel _ = O.overloadedMethod @info
#endif
#if MIN_VERSION_base(4,13,0)
instance (info ~ ResolvePreferencesFontButtonMethod t PreferencesFontButton, O.OverloadedMethod info PreferencesFontButton p, R.HasField t PreferencesFontButton p) => R.HasField t PreferencesFontButton p where
getField = O.overloadedMethod @info
#endif
instance (info ~ ResolvePreferencesFontButtonMethod t PreferencesFontButton, O.OverloadedMethodInfo info PreferencesFontButton) => OL.IsLabel t (O.MethodProxy info PreferencesFontButton) where
#if MIN_VERSION_base(4,10,0)
fromLabel = O.MethodProxy
#else
fromLabel _ = O.MethodProxy
#endif
#endif
type PreferencesFontButtonActivateCallback =
IO ()
type C_PreferencesFontButtonActivateCallback =
Ptr PreferencesFontButton ->
Ptr () ->
IO ()
foreign import ccall "wrapper"
mk_PreferencesFontButtonActivateCallback :: C_PreferencesFontButtonActivateCallback -> IO (FunPtr C_PreferencesFontButtonActivateCallback)
wrap_PreferencesFontButtonActivateCallback ::
GObject a => (a -> PreferencesFontButtonActivateCallback) ->
C_PreferencesFontButtonActivateCallback
wrap_PreferencesFontButtonActivateCallback :: forall a.
GObject a =>
(a -> IO ()) -> C_PreferencesFontButtonActivateCallback
wrap_PreferencesFontButtonActivateCallback a -> IO ()
gi'cb Ptr PreferencesFontButton
gi'selfPtr Ptr ()
_ = do
Ptr PreferencesFontButton
-> (PreferencesFontButton -> IO ()) -> IO ()
forall o b.
(HasCallStack, GObject o) =>
Ptr o -> (o -> IO b) -> IO b
B.ManagedPtr.withNewObject Ptr PreferencesFontButton
gi'selfPtr ((PreferencesFontButton -> IO ()) -> IO ())
-> (PreferencesFontButton -> IO ()) -> IO ()
forall a b. (a -> b) -> a -> b
$ \PreferencesFontButton
gi'self -> a -> IO ()
gi'cb (PreferencesFontButton -> a
forall a b. Coercible a b => a -> b
Coerce.coerce PreferencesFontButton
gi'self)
onPreferencesFontButtonActivate :: (IsPreferencesFontButton a, MonadIO m) => a -> ((?self :: a) => PreferencesFontButtonActivateCallback) -> m SignalHandlerId
onPreferencesFontButtonActivate :: forall a (m :: * -> *).
(IsPreferencesFontButton a, MonadIO m) =>
a -> ((?self::a) => IO ()) -> m SignalHandlerId
onPreferencesFontButtonActivate a
obj (?self::a) => IO ()
cb = IO SignalHandlerId -> m SignalHandlerId
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO SignalHandlerId -> m SignalHandlerId)
-> IO SignalHandlerId -> m SignalHandlerId
forall a b. (a -> b) -> a -> b
$ do
let wrapped :: a -> IO ()
wrapped a
self = let ?self = a
?self::a
self in IO ()
(?self::a) => IO ()
cb
let wrapped' :: C_PreferencesFontButtonActivateCallback
wrapped' = (a -> IO ()) -> C_PreferencesFontButtonActivateCallback
forall a.
GObject a =>
(a -> IO ()) -> C_PreferencesFontButtonActivateCallback
wrap_PreferencesFontButtonActivateCallback a -> IO ()
wrapped
FunPtr C_PreferencesFontButtonActivateCallback
wrapped'' <- C_PreferencesFontButtonActivateCallback
-> IO (FunPtr C_PreferencesFontButtonActivateCallback)
mk_PreferencesFontButtonActivateCallback C_PreferencesFontButtonActivateCallback
wrapped'
a
-> Text
-> FunPtr C_PreferencesFontButtonActivateCallback
-> SignalConnectMode
-> Maybe Text
-> IO SignalHandlerId
forall o a.
GObject o =>
o
-> Text
-> FunPtr a
-> SignalConnectMode
-> Maybe Text
-> IO SignalHandlerId
connectSignalFunPtr a
obj Text
"activate" FunPtr C_PreferencesFontButtonActivateCallback
wrapped'' SignalConnectMode
SignalConnectBefore Maybe Text
forall a. Maybe a
Nothing
afterPreferencesFontButtonActivate :: (IsPreferencesFontButton a, MonadIO m) => a -> ((?self :: a) => PreferencesFontButtonActivateCallback) -> m SignalHandlerId
afterPreferencesFontButtonActivate :: forall a (m :: * -> *).
(IsPreferencesFontButton a, MonadIO m) =>
a -> ((?self::a) => IO ()) -> m SignalHandlerId
afterPreferencesFontButtonActivate a
obj (?self::a) => IO ()
cb = IO SignalHandlerId -> m SignalHandlerId
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO SignalHandlerId -> m SignalHandlerId)
-> IO SignalHandlerId -> m SignalHandlerId
forall a b. (a -> b) -> a -> b
$ do
let wrapped :: a -> IO ()
wrapped a
self = let ?self = a
?self::a
self in IO ()
(?self::a) => IO ()
cb
let wrapped' :: C_PreferencesFontButtonActivateCallback
wrapped' = (a -> IO ()) -> C_PreferencesFontButtonActivateCallback
forall a.
GObject a =>
(a -> IO ()) -> C_PreferencesFontButtonActivateCallback
wrap_PreferencesFontButtonActivateCallback a -> IO ()
wrapped
FunPtr C_PreferencesFontButtonActivateCallback
wrapped'' <- C_PreferencesFontButtonActivateCallback
-> IO (FunPtr C_PreferencesFontButtonActivateCallback)
mk_PreferencesFontButtonActivateCallback C_PreferencesFontButtonActivateCallback
wrapped'
a
-> Text
-> FunPtr C_PreferencesFontButtonActivateCallback
-> SignalConnectMode
-> Maybe Text
-> IO SignalHandlerId
forall o a.
GObject o =>
o
-> Text
-> FunPtr a
-> SignalConnectMode
-> Maybe Text
-> IO SignalHandlerId
connectSignalFunPtr a
obj Text
"activate" FunPtr C_PreferencesFontButtonActivateCallback
wrapped'' SignalConnectMode
SignalConnectAfter Maybe Text
forall a. Maybe a
Nothing
#if defined(ENABLE_OVERLOADING)
data PreferencesFontButtonActivateSignalInfo
instance SignalInfo PreferencesFontButtonActivateSignalInfo where
type HaskellCallbackType PreferencesFontButtonActivateSignalInfo = PreferencesFontButtonActivateCallback
connectSignal obj cb connectMode detail = do
let cb' = wrap_PreferencesFontButtonActivateCallback cb
cb'' <- mk_PreferencesFontButtonActivateCallback cb'
connectSignalFunPtr obj "activate" cb'' connectMode detail
dbgSignalInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.PreferencesFontButton::activate"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-PreferencesFontButton.html#g:signal:activate"})
#endif
getPreferencesFontButtonKey :: (MonadIO m, IsPreferencesFontButton o) => o -> m (Maybe T.Text)
getPreferencesFontButtonKey :: forall (m :: * -> *) o.
(MonadIO m, IsPreferencesFontButton o) =>
o -> m (Maybe Text)
getPreferencesFontButtonKey o
obj = IO (Maybe Text) -> m (Maybe Text)
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (Maybe Text) -> m (Maybe Text))
-> IO (Maybe Text) -> m (Maybe Text)
forall a b. (a -> b) -> a -> b
$ o -> String -> IO (Maybe Text)
forall a. GObject a => a -> String -> IO (Maybe Text)
B.Properties.getObjectPropertyString o
obj String
"key"
constructPreferencesFontButtonKey :: (IsPreferencesFontButton o, MIO.MonadIO m) => T.Text -> m (GValueConstruct o)
constructPreferencesFontButtonKey :: forall o (m :: * -> *).
(IsPreferencesFontButton o, MonadIO m) =>
Text -> m (GValueConstruct o)
constructPreferencesFontButtonKey Text
val = IO (GValueConstruct o) -> m (GValueConstruct o)
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (GValueConstruct o) -> m (GValueConstruct o))
-> IO (GValueConstruct o) -> m (GValueConstruct o)
forall a b. (a -> b) -> a -> b
$ do
IO (GValueConstruct o) -> IO (GValueConstruct o)
forall a. IO a -> IO a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (GValueConstruct o) -> IO (GValueConstruct o))
-> IO (GValueConstruct o) -> IO (GValueConstruct o)
forall a b. (a -> b) -> a -> b
$ String -> Maybe Text -> IO (GValueConstruct o)
forall o. String -> Maybe Text -> IO (GValueConstruct o)
B.Properties.constructObjectPropertyString String
"key" (Text -> Maybe Text
forall a. a -> Maybe a
P.Just Text
val)
#if defined(ENABLE_OVERLOADING)
data PreferencesFontButtonKeyPropertyInfo
instance AttrInfo PreferencesFontButtonKeyPropertyInfo where
type AttrAllowedOps PreferencesFontButtonKeyPropertyInfo = '[ 'AttrConstruct, 'AttrGet, 'AttrClear]
type AttrBaseTypeConstraint PreferencesFontButtonKeyPropertyInfo = IsPreferencesFontButton
type AttrSetTypeConstraint PreferencesFontButtonKeyPropertyInfo = (~) T.Text
type AttrTransferTypeConstraint PreferencesFontButtonKeyPropertyInfo = (~) T.Text
type AttrTransferType PreferencesFontButtonKeyPropertyInfo = T.Text
type AttrGetType PreferencesFontButtonKeyPropertyInfo = (Maybe T.Text)
type AttrLabel PreferencesFontButtonKeyPropertyInfo = "key"
type AttrOrigin PreferencesFontButtonKeyPropertyInfo = PreferencesFontButton
attrGet = getPreferencesFontButtonKey
attrSet = undefined
attrTransfer _ v = do
return v
attrConstruct = constructPreferencesFontButtonKey
attrClear = undefined
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.PreferencesFontButton.key"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-PreferencesFontButton.html#g:attr:key"
})
#endif
getPreferencesFontButtonTitle :: (MonadIO m, IsPreferencesFontButton o) => o -> m (Maybe T.Text)
getPreferencesFontButtonTitle :: forall (m :: * -> *) o.
(MonadIO m, IsPreferencesFontButton o) =>
o -> m (Maybe Text)
getPreferencesFontButtonTitle o
obj = IO (Maybe Text) -> m (Maybe Text)
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (Maybe Text) -> m (Maybe Text))
-> IO (Maybe Text) -> m (Maybe Text)
forall a b. (a -> b) -> a -> b
$ o -> String -> IO (Maybe Text)
forall a. GObject a => a -> String -> IO (Maybe Text)
B.Properties.getObjectPropertyString o
obj String
"title"
constructPreferencesFontButtonTitle :: (IsPreferencesFontButton o, MIO.MonadIO m) => T.Text -> m (GValueConstruct o)
constructPreferencesFontButtonTitle :: forall o (m :: * -> *).
(IsPreferencesFontButton o, MonadIO m) =>
Text -> m (GValueConstruct o)
constructPreferencesFontButtonTitle Text
val = IO (GValueConstruct o) -> m (GValueConstruct o)
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (GValueConstruct o) -> m (GValueConstruct o))
-> IO (GValueConstruct o) -> m (GValueConstruct o)
forall a b. (a -> b) -> a -> b
$ do
IO (GValueConstruct o) -> IO (GValueConstruct o)
forall a. IO a -> IO a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (GValueConstruct o) -> IO (GValueConstruct o))
-> IO (GValueConstruct o) -> IO (GValueConstruct o)
forall a b. (a -> b) -> a -> b
$ String -> Maybe Text -> IO (GValueConstruct o)
forall o. String -> Maybe Text -> IO (GValueConstruct o)
B.Properties.constructObjectPropertyString String
"title" (Text -> Maybe Text
forall a. a -> Maybe a
P.Just Text
val)
#if defined(ENABLE_OVERLOADING)
data PreferencesFontButtonTitlePropertyInfo
instance AttrInfo PreferencesFontButtonTitlePropertyInfo where
type AttrAllowedOps PreferencesFontButtonTitlePropertyInfo = '[ 'AttrConstruct, 'AttrGet, 'AttrClear]
type AttrBaseTypeConstraint PreferencesFontButtonTitlePropertyInfo = IsPreferencesFontButton
type AttrSetTypeConstraint PreferencesFontButtonTitlePropertyInfo = (~) T.Text
type AttrTransferTypeConstraint PreferencesFontButtonTitlePropertyInfo = (~) T.Text
type AttrTransferType PreferencesFontButtonTitlePropertyInfo = T.Text
type AttrGetType PreferencesFontButtonTitlePropertyInfo = (Maybe T.Text)
type AttrLabel PreferencesFontButtonTitlePropertyInfo = "title"
type AttrOrigin PreferencesFontButtonTitlePropertyInfo = PreferencesFontButton
attrGet = getPreferencesFontButtonTitle
attrSet = undefined
attrTransfer _ v = do
return v
attrConstruct = constructPreferencesFontButtonTitle
attrClear = undefined
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.PreferencesFontButton.title"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-PreferencesFontButton.html#g:attr:title"
})
#endif
#if defined(ENABLE_OVERLOADING)
instance O.HasAttributeList PreferencesFontButton
type instance O.AttributeList PreferencesFontButton = PreferencesFontButtonAttributeList
type PreferencesFontButtonAttributeList = ('[ '("appPaintable", Gtk.Widget.WidgetAppPaintablePropertyInfo), '("borderWidth", Gtk.Container.ContainerBorderWidthPropertyInfo), '("canDefault", Gtk.Widget.WidgetCanDefaultPropertyInfo), '("canFocus", Gtk.Widget.WidgetCanFocusPropertyInfo), '("child", Gtk.Container.ContainerChildPropertyInfo), '("compositeChild", Gtk.Widget.WidgetCompositeChildPropertyInfo), '("doubleBuffered", Gtk.Widget.WidgetDoubleBufferedPropertyInfo), '("events", Gtk.Widget.WidgetEventsPropertyInfo), '("expand", Gtk.Widget.WidgetExpandPropertyInfo), '("focusOnClick", Gtk.Widget.WidgetFocusOnClickPropertyInfo), '("halign", Gtk.Widget.WidgetHalignPropertyInfo), '("hasDefault", Gtk.Widget.WidgetHasDefaultPropertyInfo), '("hasFocus", Gtk.Widget.WidgetHasFocusPropertyInfo), '("hasTooltip", Gtk.Widget.WidgetHasTooltipPropertyInfo), '("heightRequest", Gtk.Widget.WidgetHeightRequestPropertyInfo), '("hexpand", Gtk.Widget.WidgetHexpandPropertyInfo), '("hexpandSet", Gtk.Widget.WidgetHexpandSetPropertyInfo), '("isFocus", Gtk.Widget.WidgetIsFocusPropertyInfo), '("key", PreferencesFontButtonKeyPropertyInfo), '("keywords", Dazzle.PreferencesBin.PreferencesBinKeywordsPropertyInfo), '("margin", Gtk.Widget.WidgetMarginPropertyInfo), '("marginBottom", Gtk.Widget.WidgetMarginBottomPropertyInfo), '("marginEnd", Gtk.Widget.WidgetMarginEndPropertyInfo), '("marginLeft", Gtk.Widget.WidgetMarginLeftPropertyInfo), '("marginRight", Gtk.Widget.WidgetMarginRightPropertyInfo), '("marginStart", Gtk.Widget.WidgetMarginStartPropertyInfo), '("marginTop", Gtk.Widget.WidgetMarginTopPropertyInfo), '("name", Gtk.Widget.WidgetNamePropertyInfo), '("noShowAll", Gtk.Widget.WidgetNoShowAllPropertyInfo), '("opacity", Gtk.Widget.WidgetOpacityPropertyInfo), '("parent", Gtk.Widget.WidgetParentPropertyInfo), '("path", Dazzle.PreferencesBin.PreferencesBinPathPropertyInfo), '("priority", Dazzle.PreferencesBin.PreferencesBinPriorityPropertyInfo), '("receivesDefault", Gtk.Widget.WidgetReceivesDefaultPropertyInfo), '("resizeMode", Gtk.Container.ContainerResizeModePropertyInfo), '("scaleFactor", Gtk.Widget.WidgetScaleFactorPropertyInfo), '("schemaId", Dazzle.PreferencesBin.PreferencesBinSchemaIdPropertyInfo), '("sensitive", Gtk.Widget.WidgetSensitivePropertyInfo), '("style", Gtk.Widget.WidgetStylePropertyInfo), '("title", PreferencesFontButtonTitlePropertyInfo), '("tooltipMarkup", Gtk.Widget.WidgetTooltipMarkupPropertyInfo), '("tooltipText", Gtk.Widget.WidgetTooltipTextPropertyInfo), '("valign", Gtk.Widget.WidgetValignPropertyInfo), '("vexpand", Gtk.Widget.WidgetVexpandPropertyInfo), '("vexpandSet", Gtk.Widget.WidgetVexpandSetPropertyInfo), '("visible", Gtk.Widget.WidgetVisiblePropertyInfo), '("widthRequest", Gtk.Widget.WidgetWidthRequestPropertyInfo), '("window", Gtk.Widget.WidgetWindowPropertyInfo)] :: [(Symbol, DK.Type)])
#endif
#if defined(ENABLE_OVERLOADING)
preferencesFontButtonKey :: AttrLabelProxy "key"
preferencesFontButtonKey = AttrLabelProxy
preferencesFontButtonTitle :: AttrLabelProxy "title"
preferencesFontButtonTitle = AttrLabelProxy
#endif
#if defined(ENABLE_OVERLOADING)
type instance O.SignalList PreferencesFontButton = PreferencesFontButtonSignalList
type PreferencesFontButtonSignalList = ('[ '("accelClosuresChanged", Gtk.Widget.WidgetAccelClosuresChangedSignalInfo), '("activate", PreferencesFontButtonActivateSignalInfo), '("add", Gtk.Container.ContainerAddSignalInfo), '("buttonPressEvent", Gtk.Widget.WidgetButtonPressEventSignalInfo), '("buttonReleaseEvent", Gtk.Widget.WidgetButtonReleaseEventSignalInfo), '("canActivateAccel", Gtk.Widget.WidgetCanActivateAccelSignalInfo), '("checkResize", Gtk.Container.ContainerCheckResizeSignalInfo), '("childNotify", Gtk.Widget.WidgetChildNotifySignalInfo), '("compositedChanged", Gtk.Widget.WidgetCompositedChangedSignalInfo), '("configureEvent", Gtk.Widget.WidgetConfigureEventSignalInfo), '("damageEvent", Gtk.Widget.WidgetDamageEventSignalInfo), '("deleteEvent", Gtk.Widget.WidgetDeleteEventSignalInfo), '("destroy", Gtk.Widget.WidgetDestroySignalInfo), '("destroyEvent", Gtk.Widget.WidgetDestroyEventSignalInfo), '("directionChanged", Gtk.Widget.WidgetDirectionChangedSignalInfo), '("dragBegin", Gtk.Widget.WidgetDragBeginSignalInfo), '("dragDataDelete", Gtk.Widget.WidgetDragDataDeleteSignalInfo), '("dragDataGet", Gtk.Widget.WidgetDragDataGetSignalInfo), '("dragDataReceived", Gtk.Widget.WidgetDragDataReceivedSignalInfo), '("dragDrop", Gtk.Widget.WidgetDragDropSignalInfo), '("dragEnd", Gtk.Widget.WidgetDragEndSignalInfo), '("dragFailed", Gtk.Widget.WidgetDragFailedSignalInfo), '("dragLeave", Gtk.Widget.WidgetDragLeaveSignalInfo), '("dragMotion", Gtk.Widget.WidgetDragMotionSignalInfo), '("draw", Gtk.Widget.WidgetDrawSignalInfo), '("enterNotifyEvent", Gtk.Widget.WidgetEnterNotifyEventSignalInfo), '("event", Gtk.Widget.WidgetEventSignalInfo), '("eventAfter", Gtk.Widget.WidgetEventAfterSignalInfo), '("focus", Gtk.Widget.WidgetFocusSignalInfo), '("focusInEvent", Gtk.Widget.WidgetFocusInEventSignalInfo), '("focusOutEvent", Gtk.Widget.WidgetFocusOutEventSignalInfo), '("grabBrokenEvent", Gtk.Widget.WidgetGrabBrokenEventSignalInfo), '("grabFocus", Gtk.Widget.WidgetGrabFocusSignalInfo), '("grabNotify", Gtk.Widget.WidgetGrabNotifySignalInfo), '("hide", Gtk.Widget.WidgetHideSignalInfo), '("hierarchyChanged", Gtk.Widget.WidgetHierarchyChangedSignalInfo), '("keyPressEvent", Gtk.Widget.WidgetKeyPressEventSignalInfo), '("keyReleaseEvent", Gtk.Widget.WidgetKeyReleaseEventSignalInfo), '("keynavFailed", Gtk.Widget.WidgetKeynavFailedSignalInfo), '("leaveNotifyEvent", Gtk.Widget.WidgetLeaveNotifyEventSignalInfo), '("map", Gtk.Widget.WidgetMapSignalInfo), '("mapEvent", Gtk.Widget.WidgetMapEventSignalInfo), '("mnemonicActivate", Gtk.Widget.WidgetMnemonicActivateSignalInfo), '("motionNotifyEvent", Gtk.Widget.WidgetMotionNotifyEventSignalInfo), '("moveFocus", Gtk.Widget.WidgetMoveFocusSignalInfo), '("notify", GObject.Object.ObjectNotifySignalInfo), '("parentSet", Gtk.Widget.WidgetParentSetSignalInfo), '("popupMenu", Gtk.Widget.WidgetPopupMenuSignalInfo), '("preferenceActivated", Dazzle.PreferencesBin.PreferencesBinPreferenceActivatedSignalInfo), '("propertyNotifyEvent", Gtk.Widget.WidgetPropertyNotifyEventSignalInfo), '("proximityInEvent", Gtk.Widget.WidgetProximityInEventSignalInfo), '("proximityOutEvent", Gtk.Widget.WidgetProximityOutEventSignalInfo), '("queryTooltip", Gtk.Widget.WidgetQueryTooltipSignalInfo), '("realize", Gtk.Widget.WidgetRealizeSignalInfo), '("remove", Gtk.Container.ContainerRemoveSignalInfo), '("screenChanged", Gtk.Widget.WidgetScreenChangedSignalInfo), '("scrollEvent", Gtk.Widget.WidgetScrollEventSignalInfo), '("selectionClearEvent", Gtk.Widget.WidgetSelectionClearEventSignalInfo), '("selectionGet", Gtk.Widget.WidgetSelectionGetSignalInfo), '("selectionNotifyEvent", Gtk.Widget.WidgetSelectionNotifyEventSignalInfo), '("selectionReceived", Gtk.Widget.WidgetSelectionReceivedSignalInfo), '("selectionRequestEvent", Gtk.Widget.WidgetSelectionRequestEventSignalInfo), '("setFocusChild", Gtk.Container.ContainerSetFocusChildSignalInfo), '("show", Gtk.Widget.WidgetShowSignalInfo), '("showHelp", Gtk.Widget.WidgetShowHelpSignalInfo), '("sizeAllocate", Gtk.Widget.WidgetSizeAllocateSignalInfo), '("stateChanged", Gtk.Widget.WidgetStateChangedSignalInfo), '("stateFlagsChanged", Gtk.Widget.WidgetStateFlagsChangedSignalInfo), '("styleSet", Gtk.Widget.WidgetStyleSetSignalInfo), '("styleUpdated", Gtk.Widget.WidgetStyleUpdatedSignalInfo), '("touchEvent", Gtk.Widget.WidgetTouchEventSignalInfo), '("unmap", Gtk.Widget.WidgetUnmapSignalInfo), '("unmapEvent", Gtk.Widget.WidgetUnmapEventSignalInfo), '("unrealize", Gtk.Widget.WidgetUnrealizeSignalInfo), '("visibilityNotifyEvent", Gtk.Widget.WidgetVisibilityNotifyEventSignalInfo), '("windowStateEvent", Gtk.Widget.WidgetWindowStateEventSignalInfo)] :: [(Symbol, DK.Type)])
#endif