{-# LANGUAGE TypeApplications #-}
#if (MIN_VERSION_haskell_gi_overloading(1,0,0) && !defined(__HADDOCK_VERSION__))
#define ENABLE_OVERLOADING
#endif
module GI.Dazzle.Objects.PreferencesFlowBox
(
PreferencesFlowBox(..) ,
IsPreferencesFlowBox ,
toPreferencesFlowBox ,
#if defined(ENABLE_OVERLOADING)
ResolvePreferencesFlowBoxMethod ,
#endif
preferencesFlowBoxNew ,
) 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.ColumnLayout as Dazzle.ColumnLayout
import qualified GI.GObject.Objects.Object as GObject.Object
import qualified GI.Gtk.Interfaces.Buildable as Gtk.Buildable
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.ColumnLayout as Dazzle.ColumnLayout
import qualified GI.GObject.Objects.Object as GObject.Object
import qualified GI.Gtk.Interfaces.Buildable as Gtk.Buildable
import qualified GI.Gtk.Objects.Container as Gtk.Container
import qualified GI.Gtk.Objects.Widget as Gtk.Widget
#endif
newtype PreferencesFlowBox = PreferencesFlowBox (SP.ManagedPtr PreferencesFlowBox)
deriving (PreferencesFlowBox -> PreferencesFlowBox -> Bool
(PreferencesFlowBox -> PreferencesFlowBox -> Bool)
-> (PreferencesFlowBox -> PreferencesFlowBox -> Bool)
-> Eq PreferencesFlowBox
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: PreferencesFlowBox -> PreferencesFlowBox -> Bool
== :: PreferencesFlowBox -> PreferencesFlowBox -> Bool
$c/= :: PreferencesFlowBox -> PreferencesFlowBox -> Bool
/= :: PreferencesFlowBox -> PreferencesFlowBox -> Bool
Eq)
instance SP.ManagedPtrNewtype PreferencesFlowBox where
toManagedPtr :: PreferencesFlowBox -> ManagedPtr PreferencesFlowBox
toManagedPtr (PreferencesFlowBox ManagedPtr PreferencesFlowBox
p) = ManagedPtr PreferencesFlowBox
p
foreign import ccall "dzl_preferences_flow_box_get_type"
c_dzl_preferences_flow_box_get_type :: IO B.Types.GType
instance B.Types.TypedObject PreferencesFlowBox where
glibType :: IO GType
glibType = IO GType
c_dzl_preferences_flow_box_get_type
instance B.Types.GObject PreferencesFlowBox
class (SP.GObject o, O.IsDescendantOf PreferencesFlowBox o) => IsPreferencesFlowBox o
instance (SP.GObject o, O.IsDescendantOf PreferencesFlowBox o) => IsPreferencesFlowBox o
instance O.HasParentTypes PreferencesFlowBox
type instance O.ParentTypes PreferencesFlowBox = '[Dazzle.ColumnLayout.ColumnLayout, Gtk.Container.Container, Gtk.Widget.Widget, GObject.Object.Object, Atk.ImplementorIface.ImplementorIface, Gtk.Buildable.Buildable]
toPreferencesFlowBox :: (MIO.MonadIO m, IsPreferencesFlowBox o) => o -> m PreferencesFlowBox
toPreferencesFlowBox :: forall (m :: * -> *) o.
(MonadIO m, IsPreferencesFlowBox o) =>
o -> m PreferencesFlowBox
toPreferencesFlowBox = IO PreferencesFlowBox -> m PreferencesFlowBox
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO PreferencesFlowBox -> m PreferencesFlowBox)
-> (o -> IO PreferencesFlowBox) -> o -> m PreferencesFlowBox
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (ManagedPtr PreferencesFlowBox -> PreferencesFlowBox)
-> o -> IO PreferencesFlowBox
forall o o'.
(HasCallStack, ManagedPtrNewtype o, TypedObject o,
ManagedPtrNewtype o', TypedObject o') =>
(ManagedPtr o' -> o') -> o -> IO o'
B.ManagedPtr.unsafeCastTo ManagedPtr PreferencesFlowBox -> PreferencesFlowBox
PreferencesFlowBox
instance B.GValue.IsGValue (Maybe PreferencesFlowBox) where
gvalueGType_ :: IO GType
gvalueGType_ = IO GType
c_dzl_preferences_flow_box_get_type
gvalueSet_ :: Ptr GValue -> Maybe PreferencesFlowBox -> IO ()
gvalueSet_ Ptr GValue
gv Maybe PreferencesFlowBox
P.Nothing = Ptr GValue -> Ptr PreferencesFlowBox -> IO ()
forall a. GObject a => Ptr GValue -> Ptr a -> IO ()
B.GValue.set_object Ptr GValue
gv (Ptr PreferencesFlowBox
forall a. Ptr a
FP.nullPtr :: FP.Ptr PreferencesFlowBox)
gvalueSet_ Ptr GValue
gv (P.Just PreferencesFlowBox
obj) = PreferencesFlowBox -> (Ptr PreferencesFlowBox -> IO ()) -> IO ()
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
B.ManagedPtr.withManagedPtr PreferencesFlowBox
obj (Ptr GValue -> Ptr PreferencesFlowBox -> IO ()
forall a. GObject a => Ptr GValue -> Ptr a -> IO ()
B.GValue.set_object Ptr GValue
gv)
gvalueGet_ :: Ptr GValue -> IO (Maybe PreferencesFlowBox)
gvalueGet_ Ptr GValue
gv = do
Ptr PreferencesFlowBox
ptr <- Ptr GValue -> IO (Ptr PreferencesFlowBox)
forall a. GObject a => Ptr GValue -> IO (Ptr a)
B.GValue.get_object Ptr GValue
gv :: IO (FP.Ptr PreferencesFlowBox)
if Ptr PreferencesFlowBox
ptr Ptr PreferencesFlowBox -> Ptr PreferencesFlowBox -> Bool
forall a. Eq a => a -> a -> Bool
/= Ptr PreferencesFlowBox
forall a. Ptr a
FP.nullPtr
then PreferencesFlowBox -> Maybe PreferencesFlowBox
forall a. a -> Maybe a
P.Just (PreferencesFlowBox -> Maybe PreferencesFlowBox)
-> IO PreferencesFlowBox -> IO (Maybe PreferencesFlowBox)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (ManagedPtr PreferencesFlowBox -> PreferencesFlowBox)
-> Ptr PreferencesFlowBox -> IO PreferencesFlowBox
forall a b.
(HasCallStack, GObject a, GObject b) =>
(ManagedPtr a -> a) -> Ptr b -> IO a
B.ManagedPtr.newObject ManagedPtr PreferencesFlowBox -> PreferencesFlowBox
PreferencesFlowBox Ptr PreferencesFlowBox
ptr
else Maybe PreferencesFlowBox -> IO (Maybe PreferencesFlowBox)
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return Maybe PreferencesFlowBox
forall a. Maybe a
P.Nothing
#if defined(ENABLE_OVERLOADING)
type family ResolvePreferencesFlowBoxMethod (t :: Symbol) (o :: DK.Type) :: DK.Type where
ResolvePreferencesFlowBoxMethod "activate" o = Gtk.Widget.WidgetActivateMethodInfo
ResolvePreferencesFlowBoxMethod "add" o = Gtk.Container.ContainerAddMethodInfo
ResolvePreferencesFlowBoxMethod "addAccelerator" o = Gtk.Widget.WidgetAddAcceleratorMethodInfo
ResolvePreferencesFlowBoxMethod "addChild" o = Gtk.Buildable.BuildableAddChildMethodInfo
ResolvePreferencesFlowBoxMethod "addDeviceEvents" o = Gtk.Widget.WidgetAddDeviceEventsMethodInfo
ResolvePreferencesFlowBoxMethod "addEvents" o = Gtk.Widget.WidgetAddEventsMethodInfo
ResolvePreferencesFlowBoxMethod "addMnemonicLabel" o = Gtk.Widget.WidgetAddMnemonicLabelMethodInfo
ResolvePreferencesFlowBoxMethod "addTickCallback" o = Gtk.Widget.WidgetAddTickCallbackMethodInfo
ResolvePreferencesFlowBoxMethod "bindProperty" o = GObject.Object.ObjectBindPropertyMethodInfo
ResolvePreferencesFlowBoxMethod "bindPropertyFull" o = GObject.Object.ObjectBindPropertyFullMethodInfo
ResolvePreferencesFlowBoxMethod "canActivateAccel" o = Gtk.Widget.WidgetCanActivateAccelMethodInfo
ResolvePreferencesFlowBoxMethod "checkResize" o = Gtk.Container.ContainerCheckResizeMethodInfo
ResolvePreferencesFlowBoxMethod "childFocus" o = Gtk.Widget.WidgetChildFocusMethodInfo
ResolvePreferencesFlowBoxMethod "childGetProperty" o = Gtk.Container.ContainerChildGetPropertyMethodInfo
ResolvePreferencesFlowBoxMethod "childNotify" o = Gtk.Container.ContainerChildNotifyMethodInfo
ResolvePreferencesFlowBoxMethod "childNotifyByPspec" o = Gtk.Container.ContainerChildNotifyByPspecMethodInfo
ResolvePreferencesFlowBoxMethod "childSetProperty" o = Gtk.Container.ContainerChildSetPropertyMethodInfo
ResolvePreferencesFlowBoxMethod "childType" o = Gtk.Container.ContainerChildTypeMethodInfo
ResolvePreferencesFlowBoxMethod "classPath" o = Gtk.Widget.WidgetClassPathMethodInfo
ResolvePreferencesFlowBoxMethod "computeExpand" o = Gtk.Widget.WidgetComputeExpandMethodInfo
ResolvePreferencesFlowBoxMethod "constructChild" o = Gtk.Buildable.BuildableConstructChildMethodInfo
ResolvePreferencesFlowBoxMethod "createPangoContext" o = Gtk.Widget.WidgetCreatePangoContextMethodInfo
ResolvePreferencesFlowBoxMethod "createPangoLayout" o = Gtk.Widget.WidgetCreatePangoLayoutMethodInfo
ResolvePreferencesFlowBoxMethod "customFinished" o = Gtk.Buildable.BuildableCustomFinishedMethodInfo
ResolvePreferencesFlowBoxMethod "customTagEnd" o = Gtk.Buildable.BuildableCustomTagEndMethodInfo
ResolvePreferencesFlowBoxMethod "customTagStart" o = Gtk.Buildable.BuildableCustomTagStartMethodInfo
ResolvePreferencesFlowBoxMethod "destroy" o = Gtk.Widget.WidgetDestroyMethodInfo
ResolvePreferencesFlowBoxMethod "destroyed" o = Gtk.Widget.WidgetDestroyedMethodInfo
ResolvePreferencesFlowBoxMethod "deviceIsShadowed" o = Gtk.Widget.WidgetDeviceIsShadowedMethodInfo
ResolvePreferencesFlowBoxMethod "dragBegin" o = Gtk.Widget.WidgetDragBeginMethodInfo
ResolvePreferencesFlowBoxMethod "dragBeginWithCoordinates" o = Gtk.Widget.WidgetDragBeginWithCoordinatesMethodInfo
ResolvePreferencesFlowBoxMethod "dragCheckThreshold" o = Gtk.Widget.WidgetDragCheckThresholdMethodInfo
ResolvePreferencesFlowBoxMethod "dragDestAddImageTargets" o = Gtk.Widget.WidgetDragDestAddImageTargetsMethodInfo
ResolvePreferencesFlowBoxMethod "dragDestAddTextTargets" o = Gtk.Widget.WidgetDragDestAddTextTargetsMethodInfo
ResolvePreferencesFlowBoxMethod "dragDestAddUriTargets" o = Gtk.Widget.WidgetDragDestAddUriTargetsMethodInfo
ResolvePreferencesFlowBoxMethod "dragDestFindTarget" o = Gtk.Widget.WidgetDragDestFindTargetMethodInfo
ResolvePreferencesFlowBoxMethod "dragDestGetTargetList" o = Gtk.Widget.WidgetDragDestGetTargetListMethodInfo
ResolvePreferencesFlowBoxMethod "dragDestGetTrackMotion" o = Gtk.Widget.WidgetDragDestGetTrackMotionMethodInfo
ResolvePreferencesFlowBoxMethod "dragDestSet" o = Gtk.Widget.WidgetDragDestSetMethodInfo
ResolvePreferencesFlowBoxMethod "dragDestSetProxy" o = Gtk.Widget.WidgetDragDestSetProxyMethodInfo
ResolvePreferencesFlowBoxMethod "dragDestSetTargetList" o = Gtk.Widget.WidgetDragDestSetTargetListMethodInfo
ResolvePreferencesFlowBoxMethod "dragDestSetTrackMotion" o = Gtk.Widget.WidgetDragDestSetTrackMotionMethodInfo
ResolvePreferencesFlowBoxMethod "dragDestUnset" o = Gtk.Widget.WidgetDragDestUnsetMethodInfo
ResolvePreferencesFlowBoxMethod "dragGetData" o = Gtk.Widget.WidgetDragGetDataMethodInfo
ResolvePreferencesFlowBoxMethod "dragHighlight" o = Gtk.Widget.WidgetDragHighlightMethodInfo
ResolvePreferencesFlowBoxMethod "dragSourceAddImageTargets" o = Gtk.Widget.WidgetDragSourceAddImageTargetsMethodInfo
ResolvePreferencesFlowBoxMethod "dragSourceAddTextTargets" o = Gtk.Widget.WidgetDragSourceAddTextTargetsMethodInfo
ResolvePreferencesFlowBoxMethod "dragSourceAddUriTargets" o = Gtk.Widget.WidgetDragSourceAddUriTargetsMethodInfo
ResolvePreferencesFlowBoxMethod "dragSourceGetTargetList" o = Gtk.Widget.WidgetDragSourceGetTargetListMethodInfo
ResolvePreferencesFlowBoxMethod "dragSourceSet" o = Gtk.Widget.WidgetDragSourceSetMethodInfo
ResolvePreferencesFlowBoxMethod "dragSourceSetIconGicon" o = Gtk.Widget.WidgetDragSourceSetIconGiconMethodInfo
ResolvePreferencesFlowBoxMethod "dragSourceSetIconName" o = Gtk.Widget.WidgetDragSourceSetIconNameMethodInfo
ResolvePreferencesFlowBoxMethod "dragSourceSetIconPixbuf" o = Gtk.Widget.WidgetDragSourceSetIconPixbufMethodInfo
ResolvePreferencesFlowBoxMethod "dragSourceSetIconStock" o = Gtk.Widget.WidgetDragSourceSetIconStockMethodInfo
ResolvePreferencesFlowBoxMethod "dragSourceSetTargetList" o = Gtk.Widget.WidgetDragSourceSetTargetListMethodInfo
ResolvePreferencesFlowBoxMethod "dragSourceUnset" o = Gtk.Widget.WidgetDragSourceUnsetMethodInfo
ResolvePreferencesFlowBoxMethod "dragUnhighlight" o = Gtk.Widget.WidgetDragUnhighlightMethodInfo
ResolvePreferencesFlowBoxMethod "draw" o = Gtk.Widget.WidgetDrawMethodInfo
ResolvePreferencesFlowBoxMethod "ensureStyle" o = Gtk.Widget.WidgetEnsureStyleMethodInfo
ResolvePreferencesFlowBoxMethod "errorBell" o = Gtk.Widget.WidgetErrorBellMethodInfo
ResolvePreferencesFlowBoxMethod "event" o = Gtk.Widget.WidgetEventMethodInfo
ResolvePreferencesFlowBoxMethod "forall" o = Gtk.Container.ContainerForallMethodInfo
ResolvePreferencesFlowBoxMethod "forceFloating" o = GObject.Object.ObjectForceFloatingMethodInfo
ResolvePreferencesFlowBoxMethod "foreach" o = Gtk.Container.ContainerForeachMethodInfo
ResolvePreferencesFlowBoxMethod "freezeChildNotify" o = Gtk.Widget.WidgetFreezeChildNotifyMethodInfo
ResolvePreferencesFlowBoxMethod "freezeNotify" o = GObject.Object.ObjectFreezeNotifyMethodInfo
ResolvePreferencesFlowBoxMethod "getv" o = GObject.Object.ObjectGetvMethodInfo
ResolvePreferencesFlowBoxMethod "grabAdd" o = Gtk.Widget.WidgetGrabAddMethodInfo
ResolvePreferencesFlowBoxMethod "grabDefault" o = Gtk.Widget.WidgetGrabDefaultMethodInfo
ResolvePreferencesFlowBoxMethod "grabFocus" o = Gtk.Widget.WidgetGrabFocusMethodInfo
ResolvePreferencesFlowBoxMethod "grabRemove" o = Gtk.Widget.WidgetGrabRemoveMethodInfo
ResolvePreferencesFlowBoxMethod "hasDefault" o = Gtk.Widget.WidgetHasDefaultMethodInfo
ResolvePreferencesFlowBoxMethod "hasFocus" o = Gtk.Widget.WidgetHasFocusMethodInfo
ResolvePreferencesFlowBoxMethod "hasGrab" o = Gtk.Widget.WidgetHasGrabMethodInfo
ResolvePreferencesFlowBoxMethod "hasRcStyle" o = Gtk.Widget.WidgetHasRcStyleMethodInfo
ResolvePreferencesFlowBoxMethod "hasScreen" o = Gtk.Widget.WidgetHasScreenMethodInfo
ResolvePreferencesFlowBoxMethod "hasVisibleFocus" o = Gtk.Widget.WidgetHasVisibleFocusMethodInfo
ResolvePreferencesFlowBoxMethod "hide" o = Gtk.Widget.WidgetHideMethodInfo
ResolvePreferencesFlowBoxMethod "hideOnDelete" o = Gtk.Widget.WidgetHideOnDeleteMethodInfo
ResolvePreferencesFlowBoxMethod "inDestruction" o = Gtk.Widget.WidgetInDestructionMethodInfo
ResolvePreferencesFlowBoxMethod "initTemplate" o = Gtk.Widget.WidgetInitTemplateMethodInfo
ResolvePreferencesFlowBoxMethod "inputShapeCombineRegion" o = Gtk.Widget.WidgetInputShapeCombineRegionMethodInfo
ResolvePreferencesFlowBoxMethod "insertActionGroup" o = Gtk.Widget.WidgetInsertActionGroupMethodInfo
ResolvePreferencesFlowBoxMethod "intersect" o = Gtk.Widget.WidgetIntersectMethodInfo
ResolvePreferencesFlowBoxMethod "isAncestor" o = Gtk.Widget.WidgetIsAncestorMethodInfo
ResolvePreferencesFlowBoxMethod "isComposited" o = Gtk.Widget.WidgetIsCompositedMethodInfo
ResolvePreferencesFlowBoxMethod "isDrawable" o = Gtk.Widget.WidgetIsDrawableMethodInfo
ResolvePreferencesFlowBoxMethod "isFloating" o = GObject.Object.ObjectIsFloatingMethodInfo
ResolvePreferencesFlowBoxMethod "isFocus" o = Gtk.Widget.WidgetIsFocusMethodInfo
ResolvePreferencesFlowBoxMethod "isSensitive" o = Gtk.Widget.WidgetIsSensitiveMethodInfo
ResolvePreferencesFlowBoxMethod "isToplevel" o = Gtk.Widget.WidgetIsToplevelMethodInfo
ResolvePreferencesFlowBoxMethod "isVisible" o = Gtk.Widget.WidgetIsVisibleMethodInfo
ResolvePreferencesFlowBoxMethod "keynavFailed" o = Gtk.Widget.WidgetKeynavFailedMethodInfo
ResolvePreferencesFlowBoxMethod "listAccelClosures" o = Gtk.Widget.WidgetListAccelClosuresMethodInfo
ResolvePreferencesFlowBoxMethod "listActionPrefixes" o = Gtk.Widget.WidgetListActionPrefixesMethodInfo
ResolvePreferencesFlowBoxMethod "listMnemonicLabels" o = Gtk.Widget.WidgetListMnemonicLabelsMethodInfo
ResolvePreferencesFlowBoxMethod "map" o = Gtk.Widget.WidgetMapMethodInfo
ResolvePreferencesFlowBoxMethod "mnemonicActivate" o = Gtk.Widget.WidgetMnemonicActivateMethodInfo
ResolvePreferencesFlowBoxMethod "modifyBase" o = Gtk.Widget.WidgetModifyBaseMethodInfo
ResolvePreferencesFlowBoxMethod "modifyBg" o = Gtk.Widget.WidgetModifyBgMethodInfo
ResolvePreferencesFlowBoxMethod "modifyCursor" o = Gtk.Widget.WidgetModifyCursorMethodInfo
ResolvePreferencesFlowBoxMethod "modifyFg" o = Gtk.Widget.WidgetModifyFgMethodInfo
ResolvePreferencesFlowBoxMethod "modifyFont" o = Gtk.Widget.WidgetModifyFontMethodInfo
ResolvePreferencesFlowBoxMethod "modifyStyle" o = Gtk.Widget.WidgetModifyStyleMethodInfo
ResolvePreferencesFlowBoxMethod "modifyText" o = Gtk.Widget.WidgetModifyTextMethodInfo
ResolvePreferencesFlowBoxMethod "notify" o = GObject.Object.ObjectNotifyMethodInfo
ResolvePreferencesFlowBoxMethod "notifyByPspec" o = GObject.Object.ObjectNotifyByPspecMethodInfo
ResolvePreferencesFlowBoxMethod "overrideBackgroundColor" o = Gtk.Widget.WidgetOverrideBackgroundColorMethodInfo
ResolvePreferencesFlowBoxMethod "overrideColor" o = Gtk.Widget.WidgetOverrideColorMethodInfo
ResolvePreferencesFlowBoxMethod "overrideCursor" o = Gtk.Widget.WidgetOverrideCursorMethodInfo
ResolvePreferencesFlowBoxMethod "overrideFont" o = Gtk.Widget.WidgetOverrideFontMethodInfo
ResolvePreferencesFlowBoxMethod "overrideSymbolicColor" o = Gtk.Widget.WidgetOverrideSymbolicColorMethodInfo
ResolvePreferencesFlowBoxMethod "parserFinished" o = Gtk.Buildable.BuildableParserFinishedMethodInfo
ResolvePreferencesFlowBoxMethod "path" o = Gtk.Widget.WidgetPathMethodInfo
ResolvePreferencesFlowBoxMethod "propagateDraw" o = Gtk.Container.ContainerPropagateDrawMethodInfo
ResolvePreferencesFlowBoxMethod "queueAllocate" o = Gtk.Widget.WidgetQueueAllocateMethodInfo
ResolvePreferencesFlowBoxMethod "queueComputeExpand" o = Gtk.Widget.WidgetQueueComputeExpandMethodInfo
ResolvePreferencesFlowBoxMethod "queueDraw" o = Gtk.Widget.WidgetQueueDrawMethodInfo
ResolvePreferencesFlowBoxMethod "queueDrawArea" o = Gtk.Widget.WidgetQueueDrawAreaMethodInfo
ResolvePreferencesFlowBoxMethod "queueDrawRegion" o = Gtk.Widget.WidgetQueueDrawRegionMethodInfo
ResolvePreferencesFlowBoxMethod "queueResize" o = Gtk.Widget.WidgetQueueResizeMethodInfo
ResolvePreferencesFlowBoxMethod "queueResizeNoRedraw" o = Gtk.Widget.WidgetQueueResizeNoRedrawMethodInfo
ResolvePreferencesFlowBoxMethod "realize" o = Gtk.Widget.WidgetRealizeMethodInfo
ResolvePreferencesFlowBoxMethod "ref" o = GObject.Object.ObjectRefMethodInfo
ResolvePreferencesFlowBoxMethod "refSink" o = GObject.Object.ObjectRefSinkMethodInfo
ResolvePreferencesFlowBoxMethod "regionIntersect" o = Gtk.Widget.WidgetRegionIntersectMethodInfo
ResolvePreferencesFlowBoxMethod "registerWindow" o = Gtk.Widget.WidgetRegisterWindowMethodInfo
ResolvePreferencesFlowBoxMethod "remove" o = Gtk.Container.ContainerRemoveMethodInfo
ResolvePreferencesFlowBoxMethod "removeAccelerator" o = Gtk.Widget.WidgetRemoveAcceleratorMethodInfo
ResolvePreferencesFlowBoxMethod "removeMnemonicLabel" o = Gtk.Widget.WidgetRemoveMnemonicLabelMethodInfo
ResolvePreferencesFlowBoxMethod "removeTickCallback" o = Gtk.Widget.WidgetRemoveTickCallbackMethodInfo
ResolvePreferencesFlowBoxMethod "renderIcon" o = Gtk.Widget.WidgetRenderIconMethodInfo
ResolvePreferencesFlowBoxMethod "renderIconPixbuf" o = Gtk.Widget.WidgetRenderIconPixbufMethodInfo
ResolvePreferencesFlowBoxMethod "reparent" o = Gtk.Widget.WidgetReparentMethodInfo
ResolvePreferencesFlowBoxMethod "resetRcStyles" o = Gtk.Widget.WidgetResetRcStylesMethodInfo
ResolvePreferencesFlowBoxMethod "resetStyle" o = Gtk.Widget.WidgetResetStyleMethodInfo
ResolvePreferencesFlowBoxMethod "resizeChildren" o = Gtk.Container.ContainerResizeChildrenMethodInfo
ResolvePreferencesFlowBoxMethod "runDispose" o = GObject.Object.ObjectRunDisposeMethodInfo
ResolvePreferencesFlowBoxMethod "sendExpose" o = Gtk.Widget.WidgetSendExposeMethodInfo
ResolvePreferencesFlowBoxMethod "sendFocusChange" o = Gtk.Widget.WidgetSendFocusChangeMethodInfo
ResolvePreferencesFlowBoxMethod "shapeCombineRegion" o = Gtk.Widget.WidgetShapeCombineRegionMethodInfo
ResolvePreferencesFlowBoxMethod "show" o = Gtk.Widget.WidgetShowMethodInfo
ResolvePreferencesFlowBoxMethod "showAll" o = Gtk.Widget.WidgetShowAllMethodInfo
ResolvePreferencesFlowBoxMethod "showNow" o = Gtk.Widget.WidgetShowNowMethodInfo
ResolvePreferencesFlowBoxMethod "sizeAllocate" o = Gtk.Widget.WidgetSizeAllocateMethodInfo
ResolvePreferencesFlowBoxMethod "sizeAllocateWithBaseline" o = Gtk.Widget.WidgetSizeAllocateWithBaselineMethodInfo
ResolvePreferencesFlowBoxMethod "sizeRequest" o = Gtk.Widget.WidgetSizeRequestMethodInfo
ResolvePreferencesFlowBoxMethod "stealData" o = GObject.Object.ObjectStealDataMethodInfo
ResolvePreferencesFlowBoxMethod "stealQdata" o = GObject.Object.ObjectStealQdataMethodInfo
ResolvePreferencesFlowBoxMethod "styleAttach" o = Gtk.Widget.WidgetStyleAttachMethodInfo
ResolvePreferencesFlowBoxMethod "styleGetProperty" o = Gtk.Widget.WidgetStyleGetPropertyMethodInfo
ResolvePreferencesFlowBoxMethod "thawChildNotify" o = Gtk.Widget.WidgetThawChildNotifyMethodInfo
ResolvePreferencesFlowBoxMethod "thawNotify" o = GObject.Object.ObjectThawNotifyMethodInfo
ResolvePreferencesFlowBoxMethod "translateCoordinates" o = Gtk.Widget.WidgetTranslateCoordinatesMethodInfo
ResolvePreferencesFlowBoxMethod "triggerTooltipQuery" o = Gtk.Widget.WidgetTriggerTooltipQueryMethodInfo
ResolvePreferencesFlowBoxMethod "unmap" o = Gtk.Widget.WidgetUnmapMethodInfo
ResolvePreferencesFlowBoxMethod "unparent" o = Gtk.Widget.WidgetUnparentMethodInfo
ResolvePreferencesFlowBoxMethod "unrealize" o = Gtk.Widget.WidgetUnrealizeMethodInfo
ResolvePreferencesFlowBoxMethod "unref" o = GObject.Object.ObjectUnrefMethodInfo
ResolvePreferencesFlowBoxMethod "unregisterWindow" o = Gtk.Widget.WidgetUnregisterWindowMethodInfo
ResolvePreferencesFlowBoxMethod "unsetFocusChain" o = Gtk.Container.ContainerUnsetFocusChainMethodInfo
ResolvePreferencesFlowBoxMethod "unsetStateFlags" o = Gtk.Widget.WidgetUnsetStateFlagsMethodInfo
ResolvePreferencesFlowBoxMethod "watchClosure" o = GObject.Object.ObjectWatchClosureMethodInfo
ResolvePreferencesFlowBoxMethod "getAccessible" o = Gtk.Widget.WidgetGetAccessibleMethodInfo
ResolvePreferencesFlowBoxMethod "getActionGroup" o = Gtk.Widget.WidgetGetActionGroupMethodInfo
ResolvePreferencesFlowBoxMethod "getAllocatedBaseline" o = Gtk.Widget.WidgetGetAllocatedBaselineMethodInfo
ResolvePreferencesFlowBoxMethod "getAllocatedHeight" o = Gtk.Widget.WidgetGetAllocatedHeightMethodInfo
ResolvePreferencesFlowBoxMethod "getAllocatedSize" o = Gtk.Widget.WidgetGetAllocatedSizeMethodInfo
ResolvePreferencesFlowBoxMethod "getAllocatedWidth" o = Gtk.Widget.WidgetGetAllocatedWidthMethodInfo
ResolvePreferencesFlowBoxMethod "getAllocation" o = Gtk.Widget.WidgetGetAllocationMethodInfo
ResolvePreferencesFlowBoxMethod "getAncestor" o = Gtk.Widget.WidgetGetAncestorMethodInfo
ResolvePreferencesFlowBoxMethod "getAppPaintable" o = Gtk.Widget.WidgetGetAppPaintableMethodInfo
ResolvePreferencesFlowBoxMethod "getBorderWidth" o = Gtk.Container.ContainerGetBorderWidthMethodInfo
ResolvePreferencesFlowBoxMethod "getCanDefault" o = Gtk.Widget.WidgetGetCanDefaultMethodInfo
ResolvePreferencesFlowBoxMethod "getCanFocus" o = Gtk.Widget.WidgetGetCanFocusMethodInfo
ResolvePreferencesFlowBoxMethod "getChildRequisition" o = Gtk.Widget.WidgetGetChildRequisitionMethodInfo
ResolvePreferencesFlowBoxMethod "getChildVisible" o = Gtk.Widget.WidgetGetChildVisibleMethodInfo
ResolvePreferencesFlowBoxMethod "getChildren" o = Gtk.Container.ContainerGetChildrenMethodInfo
ResolvePreferencesFlowBoxMethod "getClip" o = Gtk.Widget.WidgetGetClipMethodInfo
ResolvePreferencesFlowBoxMethod "getClipboard" o = Gtk.Widget.WidgetGetClipboardMethodInfo
ResolvePreferencesFlowBoxMethod "getColumnSpacing" o = Dazzle.ColumnLayout.ColumnLayoutGetColumnSpacingMethodInfo
ResolvePreferencesFlowBoxMethod "getColumnWidth" o = Dazzle.ColumnLayout.ColumnLayoutGetColumnWidthMethodInfo
ResolvePreferencesFlowBoxMethod "getCompositeName" o = Gtk.Widget.WidgetGetCompositeNameMethodInfo
ResolvePreferencesFlowBoxMethod "getData" o = GObject.Object.ObjectGetDataMethodInfo
ResolvePreferencesFlowBoxMethod "getDeviceEnabled" o = Gtk.Widget.WidgetGetDeviceEnabledMethodInfo
ResolvePreferencesFlowBoxMethod "getDeviceEvents" o = Gtk.Widget.WidgetGetDeviceEventsMethodInfo
ResolvePreferencesFlowBoxMethod "getDirection" o = Gtk.Widget.WidgetGetDirectionMethodInfo
ResolvePreferencesFlowBoxMethod "getDisplay" o = Gtk.Widget.WidgetGetDisplayMethodInfo
ResolvePreferencesFlowBoxMethod "getDoubleBuffered" o = Gtk.Widget.WidgetGetDoubleBufferedMethodInfo
ResolvePreferencesFlowBoxMethod "getEvents" o = Gtk.Widget.WidgetGetEventsMethodInfo
ResolvePreferencesFlowBoxMethod "getFocusChain" o = Gtk.Container.ContainerGetFocusChainMethodInfo
ResolvePreferencesFlowBoxMethod "getFocusChild" o = Gtk.Container.ContainerGetFocusChildMethodInfo
ResolvePreferencesFlowBoxMethod "getFocusHadjustment" o = Gtk.Container.ContainerGetFocusHadjustmentMethodInfo
ResolvePreferencesFlowBoxMethod "getFocusOnClick" o = Gtk.Widget.WidgetGetFocusOnClickMethodInfo
ResolvePreferencesFlowBoxMethod "getFocusVadjustment" o = Gtk.Container.ContainerGetFocusVadjustmentMethodInfo
ResolvePreferencesFlowBoxMethod "getFontMap" o = Gtk.Widget.WidgetGetFontMapMethodInfo
ResolvePreferencesFlowBoxMethod "getFontOptions" o = Gtk.Widget.WidgetGetFontOptionsMethodInfo
ResolvePreferencesFlowBoxMethod "getFrameClock" o = Gtk.Widget.WidgetGetFrameClockMethodInfo
ResolvePreferencesFlowBoxMethod "getHalign" o = Gtk.Widget.WidgetGetHalignMethodInfo
ResolvePreferencesFlowBoxMethod "getHasTooltip" o = Gtk.Widget.WidgetGetHasTooltipMethodInfo
ResolvePreferencesFlowBoxMethod "getHasWindow" o = Gtk.Widget.WidgetGetHasWindowMethodInfo
ResolvePreferencesFlowBoxMethod "getHexpand" o = Gtk.Widget.WidgetGetHexpandMethodInfo
ResolvePreferencesFlowBoxMethod "getHexpandSet" o = Gtk.Widget.WidgetGetHexpandSetMethodInfo
ResolvePreferencesFlowBoxMethod "getInternalChild" o = Gtk.Buildable.BuildableGetInternalChildMethodInfo
ResolvePreferencesFlowBoxMethod "getMapped" o = Gtk.Widget.WidgetGetMappedMethodInfo
ResolvePreferencesFlowBoxMethod "getMarginBottom" o = Gtk.Widget.WidgetGetMarginBottomMethodInfo
ResolvePreferencesFlowBoxMethod "getMarginEnd" o = Gtk.Widget.WidgetGetMarginEndMethodInfo
ResolvePreferencesFlowBoxMethod "getMarginLeft" o = Gtk.Widget.WidgetGetMarginLeftMethodInfo
ResolvePreferencesFlowBoxMethod "getMarginRight" o = Gtk.Widget.WidgetGetMarginRightMethodInfo
ResolvePreferencesFlowBoxMethod "getMarginStart" o = Gtk.Widget.WidgetGetMarginStartMethodInfo
ResolvePreferencesFlowBoxMethod "getMarginTop" o = Gtk.Widget.WidgetGetMarginTopMethodInfo
ResolvePreferencesFlowBoxMethod "getMaxColumns" o = Dazzle.ColumnLayout.ColumnLayoutGetMaxColumnsMethodInfo
ResolvePreferencesFlowBoxMethod "getModifierMask" o = Gtk.Widget.WidgetGetModifierMaskMethodInfo
ResolvePreferencesFlowBoxMethod "getModifierStyle" o = Gtk.Widget.WidgetGetModifierStyleMethodInfo
ResolvePreferencesFlowBoxMethod "getName" o = Gtk.Widget.WidgetGetNameMethodInfo
ResolvePreferencesFlowBoxMethod "getNoShowAll" o = Gtk.Widget.WidgetGetNoShowAllMethodInfo
ResolvePreferencesFlowBoxMethod "getOpacity" o = Gtk.Widget.WidgetGetOpacityMethodInfo
ResolvePreferencesFlowBoxMethod "getPangoContext" o = Gtk.Widget.WidgetGetPangoContextMethodInfo
ResolvePreferencesFlowBoxMethod "getParent" o = Gtk.Widget.WidgetGetParentMethodInfo
ResolvePreferencesFlowBoxMethod "getParentWindow" o = Gtk.Widget.WidgetGetParentWindowMethodInfo
ResolvePreferencesFlowBoxMethod "getPath" o = Gtk.Widget.WidgetGetPathMethodInfo
ResolvePreferencesFlowBoxMethod "getPathForChild" o = Gtk.Container.ContainerGetPathForChildMethodInfo
ResolvePreferencesFlowBoxMethod "getPointer" o = Gtk.Widget.WidgetGetPointerMethodInfo
ResolvePreferencesFlowBoxMethod "getPreferredHeight" o = Gtk.Widget.WidgetGetPreferredHeightMethodInfo
ResolvePreferencesFlowBoxMethod "getPreferredHeightAndBaselineForWidth" o = Gtk.Widget.WidgetGetPreferredHeightAndBaselineForWidthMethodInfo
ResolvePreferencesFlowBoxMethod "getPreferredHeightForWidth" o = Gtk.Widget.WidgetGetPreferredHeightForWidthMethodInfo
ResolvePreferencesFlowBoxMethod "getPreferredSize" o = Gtk.Widget.WidgetGetPreferredSizeMethodInfo
ResolvePreferencesFlowBoxMethod "getPreferredWidth" o = Gtk.Widget.WidgetGetPreferredWidthMethodInfo
ResolvePreferencesFlowBoxMethod "getPreferredWidthForHeight" o = Gtk.Widget.WidgetGetPreferredWidthForHeightMethodInfo
ResolvePreferencesFlowBoxMethod "getProperty" o = GObject.Object.ObjectGetPropertyMethodInfo
ResolvePreferencesFlowBoxMethod "getQdata" o = GObject.Object.ObjectGetQdataMethodInfo
ResolvePreferencesFlowBoxMethod "getRealized" o = Gtk.Widget.WidgetGetRealizedMethodInfo
ResolvePreferencesFlowBoxMethod "getReceivesDefault" o = Gtk.Widget.WidgetGetReceivesDefaultMethodInfo
ResolvePreferencesFlowBoxMethod "getRequestMode" o = Gtk.Widget.WidgetGetRequestModeMethodInfo
ResolvePreferencesFlowBoxMethod "getRequisition" o = Gtk.Widget.WidgetGetRequisitionMethodInfo
ResolvePreferencesFlowBoxMethod "getResizeMode" o = Gtk.Container.ContainerGetResizeModeMethodInfo
ResolvePreferencesFlowBoxMethod "getRootWindow" o = Gtk.Widget.WidgetGetRootWindowMethodInfo
ResolvePreferencesFlowBoxMethod "getRowSpacing" o = Dazzle.ColumnLayout.ColumnLayoutGetRowSpacingMethodInfo
ResolvePreferencesFlowBoxMethod "getScaleFactor" o = Gtk.Widget.WidgetGetScaleFactorMethodInfo
ResolvePreferencesFlowBoxMethod "getScreen" o = Gtk.Widget.WidgetGetScreenMethodInfo
ResolvePreferencesFlowBoxMethod "getSensitive" o = Gtk.Widget.WidgetGetSensitiveMethodInfo
ResolvePreferencesFlowBoxMethod "getSettings" o = Gtk.Widget.WidgetGetSettingsMethodInfo
ResolvePreferencesFlowBoxMethod "getSizeRequest" o = Gtk.Widget.WidgetGetSizeRequestMethodInfo
ResolvePreferencesFlowBoxMethod "getState" o = Gtk.Widget.WidgetGetStateMethodInfo
ResolvePreferencesFlowBoxMethod "getStateFlags" o = Gtk.Widget.WidgetGetStateFlagsMethodInfo
ResolvePreferencesFlowBoxMethod "getStyle" o = Gtk.Widget.WidgetGetStyleMethodInfo
ResolvePreferencesFlowBoxMethod "getStyleContext" o = Gtk.Widget.WidgetGetStyleContextMethodInfo
ResolvePreferencesFlowBoxMethod "getSupportMultidevice" o = Gtk.Widget.WidgetGetSupportMultideviceMethodInfo
ResolvePreferencesFlowBoxMethod "getTemplateChild" o = Gtk.Widget.WidgetGetTemplateChildMethodInfo
ResolvePreferencesFlowBoxMethod "getTooltipMarkup" o = Gtk.Widget.WidgetGetTooltipMarkupMethodInfo
ResolvePreferencesFlowBoxMethod "getTooltipText" o = Gtk.Widget.WidgetGetTooltipTextMethodInfo
ResolvePreferencesFlowBoxMethod "getTooltipWindow" o = Gtk.Widget.WidgetGetTooltipWindowMethodInfo
ResolvePreferencesFlowBoxMethod "getToplevel" o = Gtk.Widget.WidgetGetToplevelMethodInfo
ResolvePreferencesFlowBoxMethod "getValign" o = Gtk.Widget.WidgetGetValignMethodInfo
ResolvePreferencesFlowBoxMethod "getValignWithBaseline" o = Gtk.Widget.WidgetGetValignWithBaselineMethodInfo
ResolvePreferencesFlowBoxMethod "getVexpand" o = Gtk.Widget.WidgetGetVexpandMethodInfo
ResolvePreferencesFlowBoxMethod "getVexpandSet" o = Gtk.Widget.WidgetGetVexpandSetMethodInfo
ResolvePreferencesFlowBoxMethod "getVisible" o = Gtk.Widget.WidgetGetVisibleMethodInfo
ResolvePreferencesFlowBoxMethod "getVisual" o = Gtk.Widget.WidgetGetVisualMethodInfo
ResolvePreferencesFlowBoxMethod "getWindow" o = Gtk.Widget.WidgetGetWindowMethodInfo
ResolvePreferencesFlowBoxMethod "setAccelPath" o = Gtk.Widget.WidgetSetAccelPathMethodInfo
ResolvePreferencesFlowBoxMethod "setAllocation" o = Gtk.Widget.WidgetSetAllocationMethodInfo
ResolvePreferencesFlowBoxMethod "setAppPaintable" o = Gtk.Widget.WidgetSetAppPaintableMethodInfo
ResolvePreferencesFlowBoxMethod "setBorderWidth" o = Gtk.Container.ContainerSetBorderWidthMethodInfo
ResolvePreferencesFlowBoxMethod "setBuildableProperty" o = Gtk.Buildable.BuildableSetBuildablePropertyMethodInfo
ResolvePreferencesFlowBoxMethod "setCanDefault" o = Gtk.Widget.WidgetSetCanDefaultMethodInfo
ResolvePreferencesFlowBoxMethod "setCanFocus" o = Gtk.Widget.WidgetSetCanFocusMethodInfo
ResolvePreferencesFlowBoxMethod "setChildVisible" o = Gtk.Widget.WidgetSetChildVisibleMethodInfo
ResolvePreferencesFlowBoxMethod "setClip" o = Gtk.Widget.WidgetSetClipMethodInfo
ResolvePreferencesFlowBoxMethod "setColumnSpacing" o = Dazzle.ColumnLayout.ColumnLayoutSetColumnSpacingMethodInfo
ResolvePreferencesFlowBoxMethod "setColumnWidth" o = Dazzle.ColumnLayout.ColumnLayoutSetColumnWidthMethodInfo
ResolvePreferencesFlowBoxMethod "setCompositeName" o = Gtk.Widget.WidgetSetCompositeNameMethodInfo
ResolvePreferencesFlowBoxMethod "setData" o = GObject.Object.ObjectSetDataMethodInfo
ResolvePreferencesFlowBoxMethod "setDataFull" o = GObject.Object.ObjectSetDataFullMethodInfo
ResolvePreferencesFlowBoxMethod "setDeviceEnabled" o = Gtk.Widget.WidgetSetDeviceEnabledMethodInfo
ResolvePreferencesFlowBoxMethod "setDeviceEvents" o = Gtk.Widget.WidgetSetDeviceEventsMethodInfo
ResolvePreferencesFlowBoxMethod "setDirection" o = Gtk.Widget.WidgetSetDirectionMethodInfo
ResolvePreferencesFlowBoxMethod "setDoubleBuffered" o = Gtk.Widget.WidgetSetDoubleBufferedMethodInfo
ResolvePreferencesFlowBoxMethod "setEvents" o = Gtk.Widget.WidgetSetEventsMethodInfo
ResolvePreferencesFlowBoxMethod "setFocusChain" o = Gtk.Container.ContainerSetFocusChainMethodInfo
ResolvePreferencesFlowBoxMethod "setFocusChild" o = Gtk.Container.ContainerSetFocusChildMethodInfo
ResolvePreferencesFlowBoxMethod "setFocusHadjustment" o = Gtk.Container.ContainerSetFocusHadjustmentMethodInfo
ResolvePreferencesFlowBoxMethod "setFocusOnClick" o = Gtk.Widget.WidgetSetFocusOnClickMethodInfo
ResolvePreferencesFlowBoxMethod "setFocusVadjustment" o = Gtk.Container.ContainerSetFocusVadjustmentMethodInfo
ResolvePreferencesFlowBoxMethod "setFontMap" o = Gtk.Widget.WidgetSetFontMapMethodInfo
ResolvePreferencesFlowBoxMethod "setFontOptions" o = Gtk.Widget.WidgetSetFontOptionsMethodInfo
ResolvePreferencesFlowBoxMethod "setHalign" o = Gtk.Widget.WidgetSetHalignMethodInfo
ResolvePreferencesFlowBoxMethod "setHasTooltip" o = Gtk.Widget.WidgetSetHasTooltipMethodInfo
ResolvePreferencesFlowBoxMethod "setHasWindow" o = Gtk.Widget.WidgetSetHasWindowMethodInfo
ResolvePreferencesFlowBoxMethod "setHexpand" o = Gtk.Widget.WidgetSetHexpandMethodInfo
ResolvePreferencesFlowBoxMethod "setHexpandSet" o = Gtk.Widget.WidgetSetHexpandSetMethodInfo
ResolvePreferencesFlowBoxMethod "setMapped" o = Gtk.Widget.WidgetSetMappedMethodInfo
ResolvePreferencesFlowBoxMethod "setMarginBottom" o = Gtk.Widget.WidgetSetMarginBottomMethodInfo
ResolvePreferencesFlowBoxMethod "setMarginEnd" o = Gtk.Widget.WidgetSetMarginEndMethodInfo
ResolvePreferencesFlowBoxMethod "setMarginLeft" o = Gtk.Widget.WidgetSetMarginLeftMethodInfo
ResolvePreferencesFlowBoxMethod "setMarginRight" o = Gtk.Widget.WidgetSetMarginRightMethodInfo
ResolvePreferencesFlowBoxMethod "setMarginStart" o = Gtk.Widget.WidgetSetMarginStartMethodInfo
ResolvePreferencesFlowBoxMethod "setMarginTop" o = Gtk.Widget.WidgetSetMarginTopMethodInfo
ResolvePreferencesFlowBoxMethod "setMaxColumns" o = Dazzle.ColumnLayout.ColumnLayoutSetMaxColumnsMethodInfo
ResolvePreferencesFlowBoxMethod "setName" o = Gtk.Widget.WidgetSetNameMethodInfo
ResolvePreferencesFlowBoxMethod "setNoShowAll" o = Gtk.Widget.WidgetSetNoShowAllMethodInfo
ResolvePreferencesFlowBoxMethod "setOpacity" o = Gtk.Widget.WidgetSetOpacityMethodInfo
ResolvePreferencesFlowBoxMethod "setParent" o = Gtk.Widget.WidgetSetParentMethodInfo
ResolvePreferencesFlowBoxMethod "setParentWindow" o = Gtk.Widget.WidgetSetParentWindowMethodInfo
ResolvePreferencesFlowBoxMethod "setProperty" o = GObject.Object.ObjectSetPropertyMethodInfo
ResolvePreferencesFlowBoxMethod "setRealized" o = Gtk.Widget.WidgetSetRealizedMethodInfo
ResolvePreferencesFlowBoxMethod "setReallocateRedraws" o = Gtk.Container.ContainerSetReallocateRedrawsMethodInfo
ResolvePreferencesFlowBoxMethod "setReceivesDefault" o = Gtk.Widget.WidgetSetReceivesDefaultMethodInfo
ResolvePreferencesFlowBoxMethod "setRedrawOnAllocate" o = Gtk.Widget.WidgetSetRedrawOnAllocateMethodInfo
ResolvePreferencesFlowBoxMethod "setResizeMode" o = Gtk.Container.ContainerSetResizeModeMethodInfo
ResolvePreferencesFlowBoxMethod "setRowSpacing" o = Dazzle.ColumnLayout.ColumnLayoutSetRowSpacingMethodInfo
ResolvePreferencesFlowBoxMethod "setSensitive" o = Gtk.Widget.WidgetSetSensitiveMethodInfo
ResolvePreferencesFlowBoxMethod "setSizeRequest" o = Gtk.Widget.WidgetSetSizeRequestMethodInfo
ResolvePreferencesFlowBoxMethod "setState" o = Gtk.Widget.WidgetSetStateMethodInfo
ResolvePreferencesFlowBoxMethod "setStateFlags" o = Gtk.Widget.WidgetSetStateFlagsMethodInfo
ResolvePreferencesFlowBoxMethod "setStyle" o = Gtk.Widget.WidgetSetStyleMethodInfo
ResolvePreferencesFlowBoxMethod "setSupportMultidevice" o = Gtk.Widget.WidgetSetSupportMultideviceMethodInfo
ResolvePreferencesFlowBoxMethod "setTooltipMarkup" o = Gtk.Widget.WidgetSetTooltipMarkupMethodInfo
ResolvePreferencesFlowBoxMethod "setTooltipText" o = Gtk.Widget.WidgetSetTooltipTextMethodInfo
ResolvePreferencesFlowBoxMethod "setTooltipWindow" o = Gtk.Widget.WidgetSetTooltipWindowMethodInfo
ResolvePreferencesFlowBoxMethod "setValign" o = Gtk.Widget.WidgetSetValignMethodInfo
ResolvePreferencesFlowBoxMethod "setVexpand" o = Gtk.Widget.WidgetSetVexpandMethodInfo
ResolvePreferencesFlowBoxMethod "setVexpandSet" o = Gtk.Widget.WidgetSetVexpandSetMethodInfo
ResolvePreferencesFlowBoxMethod "setVisible" o = Gtk.Widget.WidgetSetVisibleMethodInfo
ResolvePreferencesFlowBoxMethod "setVisual" o = Gtk.Widget.WidgetSetVisualMethodInfo
ResolvePreferencesFlowBoxMethod "setWindow" o = Gtk.Widget.WidgetSetWindowMethodInfo
ResolvePreferencesFlowBoxMethod l o = O.MethodResolutionFailed l o
instance (info ~ ResolvePreferencesFlowBoxMethod t PreferencesFlowBox, O.OverloadedMethod info PreferencesFlowBox p) => OL.IsLabel t (PreferencesFlowBox -> 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 ~ ResolvePreferencesFlowBoxMethod t PreferencesFlowBox, O.OverloadedMethod info PreferencesFlowBox p, R.HasField t PreferencesFlowBox p) => R.HasField t PreferencesFlowBox p where
getField = O.overloadedMethod @info
#endif
instance (info ~ ResolvePreferencesFlowBoxMethod t PreferencesFlowBox, O.OverloadedMethodInfo info PreferencesFlowBox) => OL.IsLabel t (O.MethodProxy info PreferencesFlowBox) where
#if MIN_VERSION_base(4,10,0)
fromLabel = O.MethodProxy
#else
fromLabel _ = O.MethodProxy
#endif
#endif
#if defined(ENABLE_OVERLOADING)
instance O.HasAttributeList PreferencesFlowBox
type instance O.AttributeList PreferencesFlowBox = PreferencesFlowBoxAttributeList
type PreferencesFlowBoxAttributeList = ('[ '("appPaintable", Gtk.Widget.WidgetAppPaintablePropertyInfo), '("borderWidth", Gtk.Container.ContainerBorderWidthPropertyInfo), '("canDefault", Gtk.Widget.WidgetCanDefaultPropertyInfo), '("canFocus", Gtk.Widget.WidgetCanFocusPropertyInfo), '("child", Gtk.Container.ContainerChildPropertyInfo), '("columnSpacing", Dazzle.ColumnLayout.ColumnLayoutColumnSpacingPropertyInfo), '("columnWidth", Dazzle.ColumnLayout.ColumnLayoutColumnWidthPropertyInfo), '("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), '("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), '("maxColumns", Dazzle.ColumnLayout.ColumnLayoutMaxColumnsPropertyInfo), '("name", Gtk.Widget.WidgetNamePropertyInfo), '("noShowAll", Gtk.Widget.WidgetNoShowAllPropertyInfo), '("opacity", Gtk.Widget.WidgetOpacityPropertyInfo), '("parent", Gtk.Widget.WidgetParentPropertyInfo), '("receivesDefault", Gtk.Widget.WidgetReceivesDefaultPropertyInfo), '("resizeMode", Gtk.Container.ContainerResizeModePropertyInfo), '("rowSpacing", Dazzle.ColumnLayout.ColumnLayoutRowSpacingPropertyInfo), '("scaleFactor", Gtk.Widget.WidgetScaleFactorPropertyInfo), '("sensitive", Gtk.Widget.WidgetSensitivePropertyInfo), '("style", Gtk.Widget.WidgetStylePropertyInfo), '("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)
#endif
#if defined(ENABLE_OVERLOADING)
type instance O.SignalList PreferencesFlowBox = PreferencesFlowBoxSignalList
type PreferencesFlowBoxSignalList = ('[ '("accelClosuresChanged", Gtk.Widget.WidgetAccelClosuresChangedSignalInfo), '("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), '("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
foreign import ccall "dzl_preferences_flow_box_new" dzl_preferences_flow_box_new ::
IO (Ptr PreferencesFlowBox)
preferencesFlowBoxNew ::
(B.CallStack.HasCallStack, MonadIO m) =>
m PreferencesFlowBox
preferencesFlowBoxNew :: forall (m :: * -> *).
(HasCallStack, MonadIO m) =>
m PreferencesFlowBox
preferencesFlowBoxNew = IO PreferencesFlowBox -> m PreferencesFlowBox
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO PreferencesFlowBox -> m PreferencesFlowBox)
-> IO PreferencesFlowBox -> m PreferencesFlowBox
forall a b. (a -> b) -> a -> b
$ do
Ptr PreferencesFlowBox
result <- IO (Ptr PreferencesFlowBox)
dzl_preferences_flow_box_new
Text -> Ptr PreferencesFlowBox -> IO ()
forall a. HasCallStack => Text -> Ptr a -> IO ()
checkUnexpectedReturnNULL Text
"preferencesFlowBoxNew" Ptr PreferencesFlowBox
result
PreferencesFlowBox
result' <- ((ManagedPtr PreferencesFlowBox -> PreferencesFlowBox)
-> Ptr PreferencesFlowBox -> IO PreferencesFlowBox
forall a b.
(HasCallStack, GObject a, GObject b) =>
(ManagedPtr a -> a) -> Ptr b -> IO a
newObject ManagedPtr PreferencesFlowBox -> PreferencesFlowBox
PreferencesFlowBox) Ptr PreferencesFlowBox
result
PreferencesFlowBox -> IO PreferencesFlowBox
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return PreferencesFlowBox
result'
#if defined(ENABLE_OVERLOADING)
#endif