{-# LANGUAGE TypeApplications #-}
#if (MIN_VERSION_haskell_gi_overloading(1,0,0) && !defined(__HADDOCK_VERSION__))
#define ENABLE_OVERLOADING
#endif
module GI.Dazzle.Objects.DockStack
(
DockStack(..) ,
IsDockStack ,
toDockStack ,
#if defined(ENABLE_OVERLOADING)
ResolveDockStackMethod ,
#endif
#if defined(ENABLE_OVERLOADING)
DockStackGetEdgeMethodInfo ,
#endif
dockStackGetEdge ,
#if defined(ENABLE_OVERLOADING)
DockStackGetShowPinnedButtonMethodInfo ,
#endif
dockStackGetShowPinnedButton ,
#if defined(ENABLE_OVERLOADING)
DockStackGetStyleMethodInfo ,
#endif
dockStackGetStyle ,
dockStackNew ,
#if defined(ENABLE_OVERLOADING)
DockStackSetEdgeMethodInfo ,
#endif
dockStackSetEdge ,
#if defined(ENABLE_OVERLOADING)
DockStackSetShowPinnedButtonMethodInfo ,
#endif
dockStackSetShowPinnedButton ,
#if defined(ENABLE_OVERLOADING)
DockStackSetStyleMethodInfo ,
#endif
dockStackSetStyle ,
#if defined(ENABLE_OVERLOADING)
DockStackEdgePropertyInfo ,
#endif
constructDockStackEdge ,
#if defined(ENABLE_OVERLOADING)
dockStackEdge ,
#endif
getDockStackEdge ,
setDockStackEdge ,
#if defined(ENABLE_OVERLOADING)
DockStackShowPinnedButtonPropertyInfo ,
#endif
constructDockStackShowPinnedButton ,
#if defined(ENABLE_OVERLOADING)
dockStackShowPinnedButton ,
#endif
getDockStackShowPinnedButton ,
setDockStackShowPinnedButton ,
#if defined(ENABLE_OVERLOADING)
DockStackStylePropertyInfo ,
#endif
constructDockStackStyle ,
#if defined(ENABLE_OVERLOADING)
dockStackStyle ,
#endif
getDockStackStyle ,
setDockStackStyle ,
) 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.Flags as Dazzle.Flags
import {-# SOURCE #-} qualified GI.Dazzle.Interfaces.Dock as Dazzle.Dock
import {-# SOURCE #-} qualified GI.Dazzle.Interfaces.DockItem as Dazzle.DockItem
import {-# SOURCE #-} qualified GI.Dazzle.Objects.DockManager as Dazzle.DockManager
import qualified GI.GObject.Objects.Object as GObject.Object
import qualified GI.Gio.Interfaces.Icon as Gio.Icon
import qualified GI.Gtk.Enums as Gtk.Enums
import qualified GI.Gtk.Interfaces.Buildable as Gtk.Buildable
import qualified GI.Gtk.Interfaces.Orientable as Gtk.Orientable
import qualified GI.Gtk.Objects.Box as Gtk.Box
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.Flags as Dazzle.Flags
import {-# SOURCE #-} qualified GI.Dazzle.Interfaces.DockItem as Dazzle.DockItem
import qualified GI.GObject.Objects.Object as GObject.Object
import qualified GI.Gtk.Enums as Gtk.Enums
import qualified GI.Gtk.Interfaces.Buildable as Gtk.Buildable
import qualified GI.Gtk.Interfaces.Orientable as Gtk.Orientable
import qualified GI.Gtk.Objects.Box as Gtk.Box
import qualified GI.Gtk.Objects.Container as Gtk.Container
import qualified GI.Gtk.Objects.Widget as Gtk.Widget
#endif
newtype DockStack = DockStack (SP.ManagedPtr DockStack)
deriving (DockStack -> DockStack -> Bool
(DockStack -> DockStack -> Bool)
-> (DockStack -> DockStack -> Bool) -> Eq DockStack
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: DockStack -> DockStack -> Bool
== :: DockStack -> DockStack -> Bool
$c/= :: DockStack -> DockStack -> Bool
/= :: DockStack -> DockStack -> Bool
Eq)
instance SP.ManagedPtrNewtype DockStack where
toManagedPtr :: DockStack -> ManagedPtr DockStack
toManagedPtr (DockStack ManagedPtr DockStack
p) = ManagedPtr DockStack
p
foreign import ccall "dzl_dock_stack_get_type"
c_dzl_dock_stack_get_type :: IO B.Types.GType
instance B.Types.TypedObject DockStack where
glibType :: IO GType
glibType = IO GType
c_dzl_dock_stack_get_type
instance B.Types.GObject DockStack
class (SP.GObject o, O.IsDescendantOf DockStack o) => IsDockStack o
instance (SP.GObject o, O.IsDescendantOf DockStack o) => IsDockStack o
instance O.HasParentTypes DockStack
type instance O.ParentTypes DockStack = '[Gtk.Box.Box, Gtk.Container.Container, Gtk.Widget.Widget, GObject.Object.Object, Atk.ImplementorIface.ImplementorIface, Dazzle.DockItem.DockItem, Gtk.Buildable.Buildable, Gtk.Orientable.Orientable]
toDockStack :: (MIO.MonadIO m, IsDockStack o) => o -> m DockStack
toDockStack :: forall (m :: * -> *) o.
(MonadIO m, IsDockStack o) =>
o -> m DockStack
toDockStack = IO DockStack -> m DockStack
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO DockStack -> m DockStack)
-> (o -> IO DockStack) -> o -> m DockStack
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (ManagedPtr DockStack -> DockStack) -> o -> IO DockStack
forall o o'.
(HasCallStack, ManagedPtrNewtype o, TypedObject o,
ManagedPtrNewtype o', TypedObject o') =>
(ManagedPtr o' -> o') -> o -> IO o'
B.ManagedPtr.unsafeCastTo ManagedPtr DockStack -> DockStack
DockStack
instance B.GValue.IsGValue (Maybe DockStack) where
gvalueGType_ :: IO GType
gvalueGType_ = IO GType
c_dzl_dock_stack_get_type
gvalueSet_ :: Ptr GValue -> Maybe DockStack -> IO ()
gvalueSet_ Ptr GValue
gv Maybe DockStack
P.Nothing = Ptr GValue -> Ptr DockStack -> IO ()
forall a. GObject a => Ptr GValue -> Ptr a -> IO ()
B.GValue.set_object Ptr GValue
gv (Ptr DockStack
forall a. Ptr a
FP.nullPtr :: FP.Ptr DockStack)
gvalueSet_ Ptr GValue
gv (P.Just DockStack
obj) = DockStack -> (Ptr DockStack -> IO ()) -> IO ()
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
B.ManagedPtr.withManagedPtr DockStack
obj (Ptr GValue -> Ptr DockStack -> IO ()
forall a. GObject a => Ptr GValue -> Ptr a -> IO ()
B.GValue.set_object Ptr GValue
gv)
gvalueGet_ :: Ptr GValue -> IO (Maybe DockStack)
gvalueGet_ Ptr GValue
gv = do
Ptr DockStack
ptr <- Ptr GValue -> IO (Ptr DockStack)
forall a. GObject a => Ptr GValue -> IO (Ptr a)
B.GValue.get_object Ptr GValue
gv :: IO (FP.Ptr DockStack)
if Ptr DockStack
ptr Ptr DockStack -> Ptr DockStack -> Bool
forall a. Eq a => a -> a -> Bool
/= Ptr DockStack
forall a. Ptr a
FP.nullPtr
then DockStack -> Maybe DockStack
forall a. a -> Maybe a
P.Just (DockStack -> Maybe DockStack)
-> IO DockStack -> IO (Maybe DockStack)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (ManagedPtr DockStack -> DockStack)
-> Ptr DockStack -> IO DockStack
forall a b.
(HasCallStack, GObject a, GObject b) =>
(ManagedPtr a -> a) -> Ptr b -> IO a
B.ManagedPtr.newObject ManagedPtr DockStack -> DockStack
DockStack Ptr DockStack
ptr
else Maybe DockStack -> IO (Maybe DockStack)
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return Maybe DockStack
forall a. Maybe a
P.Nothing
#if defined(ENABLE_OVERLOADING)
type family ResolveDockStackMethod (t :: Symbol) (o :: DK.Type) :: DK.Type where
ResolveDockStackMethod "activate" o = Gtk.Widget.WidgetActivateMethodInfo
ResolveDockStackMethod "add" o = Gtk.Container.ContainerAddMethodInfo
ResolveDockStackMethod "addAccelerator" o = Gtk.Widget.WidgetAddAcceleratorMethodInfo
ResolveDockStackMethod "addChild" o = Gtk.Buildable.BuildableAddChildMethodInfo
ResolveDockStackMethod "addDeviceEvents" o = Gtk.Widget.WidgetAddDeviceEventsMethodInfo
ResolveDockStackMethod "addEvents" o = Gtk.Widget.WidgetAddEventsMethodInfo
ResolveDockStackMethod "addMnemonicLabel" o = Gtk.Widget.WidgetAddMnemonicLabelMethodInfo
ResolveDockStackMethod "addTickCallback" o = Gtk.Widget.WidgetAddTickCallbackMethodInfo
ResolveDockStackMethod "adopt" o = Dazzle.DockItem.DockItemAdoptMethodInfo
ResolveDockStackMethod "bindProperty" o = GObject.Object.ObjectBindPropertyMethodInfo
ResolveDockStackMethod "bindPropertyFull" o = GObject.Object.ObjectBindPropertyFullMethodInfo
ResolveDockStackMethod "canActivateAccel" o = Gtk.Widget.WidgetCanActivateAccelMethodInfo
ResolveDockStackMethod "checkResize" o = Gtk.Container.ContainerCheckResizeMethodInfo
ResolveDockStackMethod "childFocus" o = Gtk.Widget.WidgetChildFocusMethodInfo
ResolveDockStackMethod "childGetProperty" o = Gtk.Container.ContainerChildGetPropertyMethodInfo
ResolveDockStackMethod "childNotify" o = Gtk.Container.ContainerChildNotifyMethodInfo
ResolveDockStackMethod "childNotifyByPspec" o = Gtk.Container.ContainerChildNotifyByPspecMethodInfo
ResolveDockStackMethod "childSetProperty" o = Gtk.Container.ContainerChildSetPropertyMethodInfo
ResolveDockStackMethod "childType" o = Gtk.Container.ContainerChildTypeMethodInfo
ResolveDockStackMethod "classPath" o = Gtk.Widget.WidgetClassPathMethodInfo
ResolveDockStackMethod "close" o = Dazzle.DockItem.DockItemCloseMethodInfo
ResolveDockStackMethod "computeExpand" o = Gtk.Widget.WidgetComputeExpandMethodInfo
ResolveDockStackMethod "constructChild" o = Gtk.Buildable.BuildableConstructChildMethodInfo
ResolveDockStackMethod "createPangoContext" o = Gtk.Widget.WidgetCreatePangoContextMethodInfo
ResolveDockStackMethod "createPangoLayout" o = Gtk.Widget.WidgetCreatePangoLayoutMethodInfo
ResolveDockStackMethod "customFinished" o = Gtk.Buildable.BuildableCustomFinishedMethodInfo
ResolveDockStackMethod "customTagEnd" o = Gtk.Buildable.BuildableCustomTagEndMethodInfo
ResolveDockStackMethod "customTagStart" o = Gtk.Buildable.BuildableCustomTagStartMethodInfo
ResolveDockStackMethod "destroy" o = Gtk.Widget.WidgetDestroyMethodInfo
ResolveDockStackMethod "destroyed" o = Gtk.Widget.WidgetDestroyedMethodInfo
ResolveDockStackMethod "deviceIsShadowed" o = Gtk.Widget.WidgetDeviceIsShadowedMethodInfo
ResolveDockStackMethod "dragBegin" o = Gtk.Widget.WidgetDragBeginMethodInfo
ResolveDockStackMethod "dragBeginWithCoordinates" o = Gtk.Widget.WidgetDragBeginWithCoordinatesMethodInfo
ResolveDockStackMethod "dragCheckThreshold" o = Gtk.Widget.WidgetDragCheckThresholdMethodInfo
ResolveDockStackMethod "dragDestAddImageTargets" o = Gtk.Widget.WidgetDragDestAddImageTargetsMethodInfo
ResolveDockStackMethod "dragDestAddTextTargets" o = Gtk.Widget.WidgetDragDestAddTextTargetsMethodInfo
ResolveDockStackMethod "dragDestAddUriTargets" o = Gtk.Widget.WidgetDragDestAddUriTargetsMethodInfo
ResolveDockStackMethod "dragDestFindTarget" o = Gtk.Widget.WidgetDragDestFindTargetMethodInfo
ResolveDockStackMethod "dragDestGetTargetList" o = Gtk.Widget.WidgetDragDestGetTargetListMethodInfo
ResolveDockStackMethod "dragDestGetTrackMotion" o = Gtk.Widget.WidgetDragDestGetTrackMotionMethodInfo
ResolveDockStackMethod "dragDestSet" o = Gtk.Widget.WidgetDragDestSetMethodInfo
ResolveDockStackMethod "dragDestSetProxy" o = Gtk.Widget.WidgetDragDestSetProxyMethodInfo
ResolveDockStackMethod "dragDestSetTargetList" o = Gtk.Widget.WidgetDragDestSetTargetListMethodInfo
ResolveDockStackMethod "dragDestSetTrackMotion" o = Gtk.Widget.WidgetDragDestSetTrackMotionMethodInfo
ResolveDockStackMethod "dragDestUnset" o = Gtk.Widget.WidgetDragDestUnsetMethodInfo
ResolveDockStackMethod "dragGetData" o = Gtk.Widget.WidgetDragGetDataMethodInfo
ResolveDockStackMethod "dragHighlight" o = Gtk.Widget.WidgetDragHighlightMethodInfo
ResolveDockStackMethod "dragSourceAddImageTargets" o = Gtk.Widget.WidgetDragSourceAddImageTargetsMethodInfo
ResolveDockStackMethod "dragSourceAddTextTargets" o = Gtk.Widget.WidgetDragSourceAddTextTargetsMethodInfo
ResolveDockStackMethod "dragSourceAddUriTargets" o = Gtk.Widget.WidgetDragSourceAddUriTargetsMethodInfo
ResolveDockStackMethod "dragSourceGetTargetList" o = Gtk.Widget.WidgetDragSourceGetTargetListMethodInfo
ResolveDockStackMethod "dragSourceSet" o = Gtk.Widget.WidgetDragSourceSetMethodInfo
ResolveDockStackMethod "dragSourceSetIconGicon" o = Gtk.Widget.WidgetDragSourceSetIconGiconMethodInfo
ResolveDockStackMethod "dragSourceSetIconName" o = Gtk.Widget.WidgetDragSourceSetIconNameMethodInfo
ResolveDockStackMethod "dragSourceSetIconPixbuf" o = Gtk.Widget.WidgetDragSourceSetIconPixbufMethodInfo
ResolveDockStackMethod "dragSourceSetIconStock" o = Gtk.Widget.WidgetDragSourceSetIconStockMethodInfo
ResolveDockStackMethod "dragSourceSetTargetList" o = Gtk.Widget.WidgetDragSourceSetTargetListMethodInfo
ResolveDockStackMethod "dragSourceUnset" o = Gtk.Widget.WidgetDragSourceUnsetMethodInfo
ResolveDockStackMethod "dragUnhighlight" o = Gtk.Widget.WidgetDragUnhighlightMethodInfo
ResolveDockStackMethod "draw" o = Gtk.Widget.WidgetDrawMethodInfo
ResolveDockStackMethod "emitPresented" o = Dazzle.DockItem.DockItemEmitPresentedMethodInfo
ResolveDockStackMethod "ensureStyle" o = Gtk.Widget.WidgetEnsureStyleMethodInfo
ResolveDockStackMethod "errorBell" o = Gtk.Widget.WidgetErrorBellMethodInfo
ResolveDockStackMethod "event" o = Gtk.Widget.WidgetEventMethodInfo
ResolveDockStackMethod "forall" o = Gtk.Container.ContainerForallMethodInfo
ResolveDockStackMethod "forceFloating" o = GObject.Object.ObjectForceFloatingMethodInfo
ResolveDockStackMethod "foreach" o = Gtk.Container.ContainerForeachMethodInfo
ResolveDockStackMethod "freezeChildNotify" o = Gtk.Widget.WidgetFreezeChildNotifyMethodInfo
ResolveDockStackMethod "freezeNotify" o = GObject.Object.ObjectFreezeNotifyMethodInfo
ResolveDockStackMethod "getv" o = GObject.Object.ObjectGetvMethodInfo
ResolveDockStackMethod "grabAdd" o = Gtk.Widget.WidgetGrabAddMethodInfo
ResolveDockStackMethod "grabDefault" o = Gtk.Widget.WidgetGrabDefaultMethodInfo
ResolveDockStackMethod "grabFocus" o = Gtk.Widget.WidgetGrabFocusMethodInfo
ResolveDockStackMethod "grabRemove" o = Gtk.Widget.WidgetGrabRemoveMethodInfo
ResolveDockStackMethod "hasDefault" o = Gtk.Widget.WidgetHasDefaultMethodInfo
ResolveDockStackMethod "hasFocus" o = Gtk.Widget.WidgetHasFocusMethodInfo
ResolveDockStackMethod "hasGrab" o = Gtk.Widget.WidgetHasGrabMethodInfo
ResolveDockStackMethod "hasRcStyle" o = Gtk.Widget.WidgetHasRcStyleMethodInfo
ResolveDockStackMethod "hasScreen" o = Gtk.Widget.WidgetHasScreenMethodInfo
ResolveDockStackMethod "hasVisibleFocus" o = Gtk.Widget.WidgetHasVisibleFocusMethodInfo
ResolveDockStackMethod "hasWidgets" o = Dazzle.DockItem.DockItemHasWidgetsMethodInfo
ResolveDockStackMethod "hide" o = Gtk.Widget.WidgetHideMethodInfo
ResolveDockStackMethod "hideOnDelete" o = Gtk.Widget.WidgetHideOnDeleteMethodInfo
ResolveDockStackMethod "inDestruction" o = Gtk.Widget.WidgetInDestructionMethodInfo
ResolveDockStackMethod "initTemplate" o = Gtk.Widget.WidgetInitTemplateMethodInfo
ResolveDockStackMethod "inputShapeCombineRegion" o = Gtk.Widget.WidgetInputShapeCombineRegionMethodInfo
ResolveDockStackMethod "insertActionGroup" o = Gtk.Widget.WidgetInsertActionGroupMethodInfo
ResolveDockStackMethod "intersect" o = Gtk.Widget.WidgetIntersectMethodInfo
ResolveDockStackMethod "isAncestor" o = Gtk.Widget.WidgetIsAncestorMethodInfo
ResolveDockStackMethod "isComposited" o = Gtk.Widget.WidgetIsCompositedMethodInfo
ResolveDockStackMethod "isDrawable" o = Gtk.Widget.WidgetIsDrawableMethodInfo
ResolveDockStackMethod "isFloating" o = GObject.Object.ObjectIsFloatingMethodInfo
ResolveDockStackMethod "isFocus" o = Gtk.Widget.WidgetIsFocusMethodInfo
ResolveDockStackMethod "isSensitive" o = Gtk.Widget.WidgetIsSensitiveMethodInfo
ResolveDockStackMethod "isToplevel" o = Gtk.Widget.WidgetIsToplevelMethodInfo
ResolveDockStackMethod "isVisible" o = Gtk.Widget.WidgetIsVisibleMethodInfo
ResolveDockStackMethod "keynavFailed" o = Gtk.Widget.WidgetKeynavFailedMethodInfo
ResolveDockStackMethod "listAccelClosures" o = Gtk.Widget.WidgetListAccelClosuresMethodInfo
ResolveDockStackMethod "listActionPrefixes" o = Gtk.Widget.WidgetListActionPrefixesMethodInfo
ResolveDockStackMethod "listMnemonicLabels" o = Gtk.Widget.WidgetListMnemonicLabelsMethodInfo
ResolveDockStackMethod "map" o = Gtk.Widget.WidgetMapMethodInfo
ResolveDockStackMethod "minimize" o = Dazzle.DockItem.DockItemMinimizeMethodInfo
ResolveDockStackMethod "mnemonicActivate" o = Gtk.Widget.WidgetMnemonicActivateMethodInfo
ResolveDockStackMethod "modifyBase" o = Gtk.Widget.WidgetModifyBaseMethodInfo
ResolveDockStackMethod "modifyBg" o = Gtk.Widget.WidgetModifyBgMethodInfo
ResolveDockStackMethod "modifyCursor" o = Gtk.Widget.WidgetModifyCursorMethodInfo
ResolveDockStackMethod "modifyFg" o = Gtk.Widget.WidgetModifyFgMethodInfo
ResolveDockStackMethod "modifyFont" o = Gtk.Widget.WidgetModifyFontMethodInfo
ResolveDockStackMethod "modifyStyle" o = Gtk.Widget.WidgetModifyStyleMethodInfo
ResolveDockStackMethod "modifyText" o = Gtk.Widget.WidgetModifyTextMethodInfo
ResolveDockStackMethod "needsAttention" o = Dazzle.DockItem.DockItemNeedsAttentionMethodInfo
ResolveDockStackMethod "notify" o = GObject.Object.ObjectNotifyMethodInfo
ResolveDockStackMethod "notifyByPspec" o = GObject.Object.ObjectNotifyByPspecMethodInfo
ResolveDockStackMethod "overrideBackgroundColor" o = Gtk.Widget.WidgetOverrideBackgroundColorMethodInfo
ResolveDockStackMethod "overrideColor" o = Gtk.Widget.WidgetOverrideColorMethodInfo
ResolveDockStackMethod "overrideCursor" o = Gtk.Widget.WidgetOverrideCursorMethodInfo
ResolveDockStackMethod "overrideFont" o = Gtk.Widget.WidgetOverrideFontMethodInfo
ResolveDockStackMethod "overrideSymbolicColor" o = Gtk.Widget.WidgetOverrideSymbolicColorMethodInfo
ResolveDockStackMethod "packEnd" o = Gtk.Box.BoxPackEndMethodInfo
ResolveDockStackMethod "packStart" o = Gtk.Box.BoxPackStartMethodInfo
ResolveDockStackMethod "parserFinished" o = Gtk.Buildable.BuildableParserFinishedMethodInfo
ResolveDockStackMethod "path" o = Gtk.Widget.WidgetPathMethodInfo
ResolveDockStackMethod "present" o = Dazzle.DockItem.DockItemPresentMethodInfo
ResolveDockStackMethod "presentChild" o = Dazzle.DockItem.DockItemPresentChildMethodInfo
ResolveDockStackMethod "propagateDraw" o = Gtk.Container.ContainerPropagateDrawMethodInfo
ResolveDockStackMethod "queryChildPacking" o = Gtk.Box.BoxQueryChildPackingMethodInfo
ResolveDockStackMethod "queueAllocate" o = Gtk.Widget.WidgetQueueAllocateMethodInfo
ResolveDockStackMethod "queueComputeExpand" o = Gtk.Widget.WidgetQueueComputeExpandMethodInfo
ResolveDockStackMethod "queueDraw" o = Gtk.Widget.WidgetQueueDrawMethodInfo
ResolveDockStackMethod "queueDrawArea" o = Gtk.Widget.WidgetQueueDrawAreaMethodInfo
ResolveDockStackMethod "queueDrawRegion" o = Gtk.Widget.WidgetQueueDrawRegionMethodInfo
ResolveDockStackMethod "queueResize" o = Gtk.Widget.WidgetQueueResizeMethodInfo
ResolveDockStackMethod "queueResizeNoRedraw" o = Gtk.Widget.WidgetQueueResizeNoRedrawMethodInfo
ResolveDockStackMethod "realize" o = Gtk.Widget.WidgetRealizeMethodInfo
ResolveDockStackMethod "ref" o = GObject.Object.ObjectRefMethodInfo
ResolveDockStackMethod "refGicon" o = Dazzle.DockItem.DockItemRefGiconMethodInfo
ResolveDockStackMethod "refSink" o = GObject.Object.ObjectRefSinkMethodInfo
ResolveDockStackMethod "regionIntersect" o = Gtk.Widget.WidgetRegionIntersectMethodInfo
ResolveDockStackMethod "registerWindow" o = Gtk.Widget.WidgetRegisterWindowMethodInfo
ResolveDockStackMethod "release" o = Dazzle.DockItem.DockItemReleaseMethodInfo
ResolveDockStackMethod "remove" o = Gtk.Container.ContainerRemoveMethodInfo
ResolveDockStackMethod "removeAccelerator" o = Gtk.Widget.WidgetRemoveAcceleratorMethodInfo
ResolveDockStackMethod "removeMnemonicLabel" o = Gtk.Widget.WidgetRemoveMnemonicLabelMethodInfo
ResolveDockStackMethod "removeTickCallback" o = Gtk.Widget.WidgetRemoveTickCallbackMethodInfo
ResolveDockStackMethod "renderIcon" o = Gtk.Widget.WidgetRenderIconMethodInfo
ResolveDockStackMethod "renderIconPixbuf" o = Gtk.Widget.WidgetRenderIconPixbufMethodInfo
ResolveDockStackMethod "reorderChild" o = Gtk.Box.BoxReorderChildMethodInfo
ResolveDockStackMethod "reparent" o = Gtk.Widget.WidgetReparentMethodInfo
ResolveDockStackMethod "resetRcStyles" o = Gtk.Widget.WidgetResetRcStylesMethodInfo
ResolveDockStackMethod "resetStyle" o = Gtk.Widget.WidgetResetStyleMethodInfo
ResolveDockStackMethod "resizeChildren" o = Gtk.Container.ContainerResizeChildrenMethodInfo
ResolveDockStackMethod "runDispose" o = GObject.Object.ObjectRunDisposeMethodInfo
ResolveDockStackMethod "sendExpose" o = Gtk.Widget.WidgetSendExposeMethodInfo
ResolveDockStackMethod "sendFocusChange" o = Gtk.Widget.WidgetSendFocusChangeMethodInfo
ResolveDockStackMethod "shapeCombineRegion" o = Gtk.Widget.WidgetShapeCombineRegionMethodInfo
ResolveDockStackMethod "show" o = Gtk.Widget.WidgetShowMethodInfo
ResolveDockStackMethod "showAll" o = Gtk.Widget.WidgetShowAllMethodInfo
ResolveDockStackMethod "showNow" o = Gtk.Widget.WidgetShowNowMethodInfo
ResolveDockStackMethod "sizeAllocate" o = Gtk.Widget.WidgetSizeAllocateMethodInfo
ResolveDockStackMethod "sizeAllocateWithBaseline" o = Gtk.Widget.WidgetSizeAllocateWithBaselineMethodInfo
ResolveDockStackMethod "sizeRequest" o = Gtk.Widget.WidgetSizeRequestMethodInfo
ResolveDockStackMethod "stealData" o = GObject.Object.ObjectStealDataMethodInfo
ResolveDockStackMethod "stealQdata" o = GObject.Object.ObjectStealQdataMethodInfo
ResolveDockStackMethod "styleAttach" o = Gtk.Widget.WidgetStyleAttachMethodInfo
ResolveDockStackMethod "styleGetProperty" o = Gtk.Widget.WidgetStyleGetPropertyMethodInfo
ResolveDockStackMethod "thawChildNotify" o = Gtk.Widget.WidgetThawChildNotifyMethodInfo
ResolveDockStackMethod "thawNotify" o = GObject.Object.ObjectThawNotifyMethodInfo
ResolveDockStackMethod "translateCoordinates" o = Gtk.Widget.WidgetTranslateCoordinatesMethodInfo
ResolveDockStackMethod "triggerTooltipQuery" o = Gtk.Widget.WidgetTriggerTooltipQueryMethodInfo
ResolveDockStackMethod "unmap" o = Gtk.Widget.WidgetUnmapMethodInfo
ResolveDockStackMethod "unparent" o = Gtk.Widget.WidgetUnparentMethodInfo
ResolveDockStackMethod "unrealize" o = Gtk.Widget.WidgetUnrealizeMethodInfo
ResolveDockStackMethod "unref" o = GObject.Object.ObjectUnrefMethodInfo
ResolveDockStackMethod "unregisterWindow" o = Gtk.Widget.WidgetUnregisterWindowMethodInfo
ResolveDockStackMethod "unsetFocusChain" o = Gtk.Container.ContainerUnsetFocusChainMethodInfo
ResolveDockStackMethod "unsetStateFlags" o = Gtk.Widget.WidgetUnsetStateFlagsMethodInfo
ResolveDockStackMethod "updateVisibility" o = Dazzle.DockItem.DockItemUpdateVisibilityMethodInfo
ResolveDockStackMethod "watchClosure" o = GObject.Object.ObjectWatchClosureMethodInfo
ResolveDockStackMethod "getAccessible" o = Gtk.Widget.WidgetGetAccessibleMethodInfo
ResolveDockStackMethod "getActionGroup" o = Gtk.Widget.WidgetGetActionGroupMethodInfo
ResolveDockStackMethod "getAllocatedBaseline" o = Gtk.Widget.WidgetGetAllocatedBaselineMethodInfo
ResolveDockStackMethod "getAllocatedHeight" o = Gtk.Widget.WidgetGetAllocatedHeightMethodInfo
ResolveDockStackMethod "getAllocatedSize" o = Gtk.Widget.WidgetGetAllocatedSizeMethodInfo
ResolveDockStackMethod "getAllocatedWidth" o = Gtk.Widget.WidgetGetAllocatedWidthMethodInfo
ResolveDockStackMethod "getAllocation" o = Gtk.Widget.WidgetGetAllocationMethodInfo
ResolveDockStackMethod "getAncestor" o = Gtk.Widget.WidgetGetAncestorMethodInfo
ResolveDockStackMethod "getAppPaintable" o = Gtk.Widget.WidgetGetAppPaintableMethodInfo
ResolveDockStackMethod "getBaselinePosition" o = Gtk.Box.BoxGetBaselinePositionMethodInfo
ResolveDockStackMethod "getBorderWidth" o = Gtk.Container.ContainerGetBorderWidthMethodInfo
ResolveDockStackMethod "getCanClose" o = Dazzle.DockItem.DockItemGetCanCloseMethodInfo
ResolveDockStackMethod "getCanDefault" o = Gtk.Widget.WidgetGetCanDefaultMethodInfo
ResolveDockStackMethod "getCanFocus" o = Gtk.Widget.WidgetGetCanFocusMethodInfo
ResolveDockStackMethod "getCanMinimize" o = Dazzle.DockItem.DockItemGetCanMinimizeMethodInfo
ResolveDockStackMethod "getCenterWidget" o = Gtk.Box.BoxGetCenterWidgetMethodInfo
ResolveDockStackMethod "getChildRequisition" o = Gtk.Widget.WidgetGetChildRequisitionMethodInfo
ResolveDockStackMethod "getChildVisible" o = Gtk.Widget.WidgetGetChildVisibleMethodInfo
ResolveDockStackMethod "getChildren" o = Gtk.Container.ContainerGetChildrenMethodInfo
ResolveDockStackMethod "getClip" o = Gtk.Widget.WidgetGetClipMethodInfo
ResolveDockStackMethod "getClipboard" o = Gtk.Widget.WidgetGetClipboardMethodInfo
ResolveDockStackMethod "getCompositeName" o = Gtk.Widget.WidgetGetCompositeNameMethodInfo
ResolveDockStackMethod "getData" o = GObject.Object.ObjectGetDataMethodInfo
ResolveDockStackMethod "getDeviceEnabled" o = Gtk.Widget.WidgetGetDeviceEnabledMethodInfo
ResolveDockStackMethod "getDeviceEvents" o = Gtk.Widget.WidgetGetDeviceEventsMethodInfo
ResolveDockStackMethod "getDirection" o = Gtk.Widget.WidgetGetDirectionMethodInfo
ResolveDockStackMethod "getDisplay" o = Gtk.Widget.WidgetGetDisplayMethodInfo
ResolveDockStackMethod "getDoubleBuffered" o = Gtk.Widget.WidgetGetDoubleBufferedMethodInfo
ResolveDockStackMethod "getEdge" o = DockStackGetEdgeMethodInfo
ResolveDockStackMethod "getEvents" o = Gtk.Widget.WidgetGetEventsMethodInfo
ResolveDockStackMethod "getFocusChain" o = Gtk.Container.ContainerGetFocusChainMethodInfo
ResolveDockStackMethod "getFocusChild" o = Gtk.Container.ContainerGetFocusChildMethodInfo
ResolveDockStackMethod "getFocusHadjustment" o = Gtk.Container.ContainerGetFocusHadjustmentMethodInfo
ResolveDockStackMethod "getFocusOnClick" o = Gtk.Widget.WidgetGetFocusOnClickMethodInfo
ResolveDockStackMethod "getFocusVadjustment" o = Gtk.Container.ContainerGetFocusVadjustmentMethodInfo
ResolveDockStackMethod "getFontMap" o = Gtk.Widget.WidgetGetFontMapMethodInfo
ResolveDockStackMethod "getFontOptions" o = Gtk.Widget.WidgetGetFontOptionsMethodInfo
ResolveDockStackMethod "getFrameClock" o = Gtk.Widget.WidgetGetFrameClockMethodInfo
ResolveDockStackMethod "getHalign" o = Gtk.Widget.WidgetGetHalignMethodInfo
ResolveDockStackMethod "getHasTooltip" o = Gtk.Widget.WidgetGetHasTooltipMethodInfo
ResolveDockStackMethod "getHasWindow" o = Gtk.Widget.WidgetGetHasWindowMethodInfo
ResolveDockStackMethod "getHexpand" o = Gtk.Widget.WidgetGetHexpandMethodInfo
ResolveDockStackMethod "getHexpandSet" o = Gtk.Widget.WidgetGetHexpandSetMethodInfo
ResolveDockStackMethod "getHomogeneous" o = Gtk.Box.BoxGetHomogeneousMethodInfo
ResolveDockStackMethod "getIconName" o = Dazzle.DockItem.DockItemGetIconNameMethodInfo
ResolveDockStackMethod "getInternalChild" o = Gtk.Buildable.BuildableGetInternalChildMethodInfo
ResolveDockStackMethod "getManager" o = Dazzle.DockItem.DockItemGetManagerMethodInfo
ResolveDockStackMethod "getMapped" o = Gtk.Widget.WidgetGetMappedMethodInfo
ResolveDockStackMethod "getMarginBottom" o = Gtk.Widget.WidgetGetMarginBottomMethodInfo
ResolveDockStackMethod "getMarginEnd" o = Gtk.Widget.WidgetGetMarginEndMethodInfo
ResolveDockStackMethod "getMarginLeft" o = Gtk.Widget.WidgetGetMarginLeftMethodInfo
ResolveDockStackMethod "getMarginRight" o = Gtk.Widget.WidgetGetMarginRightMethodInfo
ResolveDockStackMethod "getMarginStart" o = Gtk.Widget.WidgetGetMarginStartMethodInfo
ResolveDockStackMethod "getMarginTop" o = Gtk.Widget.WidgetGetMarginTopMethodInfo
ResolveDockStackMethod "getModifierMask" o = Gtk.Widget.WidgetGetModifierMaskMethodInfo
ResolveDockStackMethod "getModifierStyle" o = Gtk.Widget.WidgetGetModifierStyleMethodInfo
ResolveDockStackMethod "getName" o = Gtk.Widget.WidgetGetNameMethodInfo
ResolveDockStackMethod "getNoShowAll" o = Gtk.Widget.WidgetGetNoShowAllMethodInfo
ResolveDockStackMethod "getOpacity" o = Gtk.Widget.WidgetGetOpacityMethodInfo
ResolveDockStackMethod "getOrientation" o = Gtk.Orientable.OrientableGetOrientationMethodInfo
ResolveDockStackMethod "getPangoContext" o = Gtk.Widget.WidgetGetPangoContextMethodInfo
ResolveDockStackMethod "getParent" o = Gtk.Widget.WidgetGetParentMethodInfo
ResolveDockStackMethod "getParentWindow" o = Gtk.Widget.WidgetGetParentWindowMethodInfo
ResolveDockStackMethod "getPath" o = Gtk.Widget.WidgetGetPathMethodInfo
ResolveDockStackMethod "getPathForChild" o = Gtk.Container.ContainerGetPathForChildMethodInfo
ResolveDockStackMethod "getPointer" o = Gtk.Widget.WidgetGetPointerMethodInfo
ResolveDockStackMethod "getPreferredHeight" o = Gtk.Widget.WidgetGetPreferredHeightMethodInfo
ResolveDockStackMethod "getPreferredHeightAndBaselineForWidth" o = Gtk.Widget.WidgetGetPreferredHeightAndBaselineForWidthMethodInfo
ResolveDockStackMethod "getPreferredHeightForWidth" o = Gtk.Widget.WidgetGetPreferredHeightForWidthMethodInfo
ResolveDockStackMethod "getPreferredSize" o = Gtk.Widget.WidgetGetPreferredSizeMethodInfo
ResolveDockStackMethod "getPreferredWidth" o = Gtk.Widget.WidgetGetPreferredWidthMethodInfo
ResolveDockStackMethod "getPreferredWidthForHeight" o = Gtk.Widget.WidgetGetPreferredWidthForHeightMethodInfo
ResolveDockStackMethod "getProperty" o = GObject.Object.ObjectGetPropertyMethodInfo
ResolveDockStackMethod "getQdata" o = GObject.Object.ObjectGetQdataMethodInfo
ResolveDockStackMethod "getRealized" o = Gtk.Widget.WidgetGetRealizedMethodInfo
ResolveDockStackMethod "getReceivesDefault" o = Gtk.Widget.WidgetGetReceivesDefaultMethodInfo
ResolveDockStackMethod "getRequestMode" o = Gtk.Widget.WidgetGetRequestModeMethodInfo
ResolveDockStackMethod "getRequisition" o = Gtk.Widget.WidgetGetRequisitionMethodInfo
ResolveDockStackMethod "getResizeMode" o = Gtk.Container.ContainerGetResizeModeMethodInfo
ResolveDockStackMethod "getRootWindow" o = Gtk.Widget.WidgetGetRootWindowMethodInfo
ResolveDockStackMethod "getScaleFactor" o = Gtk.Widget.WidgetGetScaleFactorMethodInfo
ResolveDockStackMethod "getScreen" o = Gtk.Widget.WidgetGetScreenMethodInfo
ResolveDockStackMethod "getSensitive" o = Gtk.Widget.WidgetGetSensitiveMethodInfo
ResolveDockStackMethod "getSettings" o = Gtk.Widget.WidgetGetSettingsMethodInfo
ResolveDockStackMethod "getShowPinnedButton" o = DockStackGetShowPinnedButtonMethodInfo
ResolveDockStackMethod "getSizeRequest" o = Gtk.Widget.WidgetGetSizeRequestMethodInfo
ResolveDockStackMethod "getSpacing" o = Gtk.Box.BoxGetSpacingMethodInfo
ResolveDockStackMethod "getState" o = Gtk.Widget.WidgetGetStateMethodInfo
ResolveDockStackMethod "getStateFlags" o = Gtk.Widget.WidgetGetStateFlagsMethodInfo
ResolveDockStackMethod "getStyle" o = DockStackGetStyleMethodInfo
ResolveDockStackMethod "getStyleContext" o = Gtk.Widget.WidgetGetStyleContextMethodInfo
ResolveDockStackMethod "getSupportMultidevice" o = Gtk.Widget.WidgetGetSupportMultideviceMethodInfo
ResolveDockStackMethod "getTemplateChild" o = Gtk.Widget.WidgetGetTemplateChildMethodInfo
ResolveDockStackMethod "getTitle" o = Dazzle.DockItem.DockItemGetTitleMethodInfo
ResolveDockStackMethod "getTooltipMarkup" o = Gtk.Widget.WidgetGetTooltipMarkupMethodInfo
ResolveDockStackMethod "getTooltipText" o = Gtk.Widget.WidgetGetTooltipTextMethodInfo
ResolveDockStackMethod "getTooltipWindow" o = Gtk.Widget.WidgetGetTooltipWindowMethodInfo
ResolveDockStackMethod "getToplevel" o = Gtk.Widget.WidgetGetToplevelMethodInfo
ResolveDockStackMethod "getValign" o = Gtk.Widget.WidgetGetValignMethodInfo
ResolveDockStackMethod "getValignWithBaseline" o = Gtk.Widget.WidgetGetValignWithBaselineMethodInfo
ResolveDockStackMethod "getVexpand" o = Gtk.Widget.WidgetGetVexpandMethodInfo
ResolveDockStackMethod "getVexpandSet" o = Gtk.Widget.WidgetGetVexpandSetMethodInfo
ResolveDockStackMethod "getVisible" o = Gtk.Widget.WidgetGetVisibleMethodInfo
ResolveDockStackMethod "getVisual" o = Gtk.Widget.WidgetGetVisualMethodInfo
ResolveDockStackMethod "getWindow" o = Gtk.Widget.WidgetGetWindowMethodInfo
ResolveDockStackMethod "setAccelPath" o = Gtk.Widget.WidgetSetAccelPathMethodInfo
ResolveDockStackMethod "setAllocation" o = Gtk.Widget.WidgetSetAllocationMethodInfo
ResolveDockStackMethod "setAppPaintable" o = Gtk.Widget.WidgetSetAppPaintableMethodInfo
ResolveDockStackMethod "setBaselinePosition" o = Gtk.Box.BoxSetBaselinePositionMethodInfo
ResolveDockStackMethod "setBorderWidth" o = Gtk.Container.ContainerSetBorderWidthMethodInfo
ResolveDockStackMethod "setBuildableProperty" o = Gtk.Buildable.BuildableSetBuildablePropertyMethodInfo
ResolveDockStackMethod "setCanDefault" o = Gtk.Widget.WidgetSetCanDefaultMethodInfo
ResolveDockStackMethod "setCanFocus" o = Gtk.Widget.WidgetSetCanFocusMethodInfo
ResolveDockStackMethod "setCenterWidget" o = Gtk.Box.BoxSetCenterWidgetMethodInfo
ResolveDockStackMethod "setChildPacking" o = Gtk.Box.BoxSetChildPackingMethodInfo
ResolveDockStackMethod "setChildVisible" o = Gtk.Widget.WidgetSetChildVisibleMethodInfo
ResolveDockStackMethod "setClip" o = Gtk.Widget.WidgetSetClipMethodInfo
ResolveDockStackMethod "setCompositeName" o = Gtk.Widget.WidgetSetCompositeNameMethodInfo
ResolveDockStackMethod "setData" o = GObject.Object.ObjectSetDataMethodInfo
ResolveDockStackMethod "setDataFull" o = GObject.Object.ObjectSetDataFullMethodInfo
ResolveDockStackMethod "setDeviceEnabled" o = Gtk.Widget.WidgetSetDeviceEnabledMethodInfo
ResolveDockStackMethod "setDeviceEvents" o = Gtk.Widget.WidgetSetDeviceEventsMethodInfo
ResolveDockStackMethod "setDirection" o = Gtk.Widget.WidgetSetDirectionMethodInfo
ResolveDockStackMethod "setDoubleBuffered" o = Gtk.Widget.WidgetSetDoubleBufferedMethodInfo
ResolveDockStackMethod "setEdge" o = DockStackSetEdgeMethodInfo
ResolveDockStackMethod "setEvents" o = Gtk.Widget.WidgetSetEventsMethodInfo
ResolveDockStackMethod "setFocusChain" o = Gtk.Container.ContainerSetFocusChainMethodInfo
ResolveDockStackMethod "setFocusChild" o = Gtk.Container.ContainerSetFocusChildMethodInfo
ResolveDockStackMethod "setFocusHadjustment" o = Gtk.Container.ContainerSetFocusHadjustmentMethodInfo
ResolveDockStackMethod "setFocusOnClick" o = Gtk.Widget.WidgetSetFocusOnClickMethodInfo
ResolveDockStackMethod "setFocusVadjustment" o = Gtk.Container.ContainerSetFocusVadjustmentMethodInfo
ResolveDockStackMethod "setFontMap" o = Gtk.Widget.WidgetSetFontMapMethodInfo
ResolveDockStackMethod "setFontOptions" o = Gtk.Widget.WidgetSetFontOptionsMethodInfo
ResolveDockStackMethod "setHalign" o = Gtk.Widget.WidgetSetHalignMethodInfo
ResolveDockStackMethod "setHasTooltip" o = Gtk.Widget.WidgetSetHasTooltipMethodInfo
ResolveDockStackMethod "setHasWindow" o = Gtk.Widget.WidgetSetHasWindowMethodInfo
ResolveDockStackMethod "setHexpand" o = Gtk.Widget.WidgetSetHexpandMethodInfo
ResolveDockStackMethod "setHexpandSet" o = Gtk.Widget.WidgetSetHexpandSetMethodInfo
ResolveDockStackMethod "setHomogeneous" o = Gtk.Box.BoxSetHomogeneousMethodInfo
ResolveDockStackMethod "setManager" o = Dazzle.DockItem.DockItemSetManagerMethodInfo
ResolveDockStackMethod "setMapped" o = Gtk.Widget.WidgetSetMappedMethodInfo
ResolveDockStackMethod "setMarginBottom" o = Gtk.Widget.WidgetSetMarginBottomMethodInfo
ResolveDockStackMethod "setMarginEnd" o = Gtk.Widget.WidgetSetMarginEndMethodInfo
ResolveDockStackMethod "setMarginLeft" o = Gtk.Widget.WidgetSetMarginLeftMethodInfo
ResolveDockStackMethod "setMarginRight" o = Gtk.Widget.WidgetSetMarginRightMethodInfo
ResolveDockStackMethod "setMarginStart" o = Gtk.Widget.WidgetSetMarginStartMethodInfo
ResolveDockStackMethod "setMarginTop" o = Gtk.Widget.WidgetSetMarginTopMethodInfo
ResolveDockStackMethod "setName" o = Gtk.Widget.WidgetSetNameMethodInfo
ResolveDockStackMethod "setNoShowAll" o = Gtk.Widget.WidgetSetNoShowAllMethodInfo
ResolveDockStackMethod "setOpacity" o = Gtk.Widget.WidgetSetOpacityMethodInfo
ResolveDockStackMethod "setOrientation" o = Gtk.Orientable.OrientableSetOrientationMethodInfo
ResolveDockStackMethod "setParent" o = Gtk.Widget.WidgetSetParentMethodInfo
ResolveDockStackMethod "setParentWindow" o = Gtk.Widget.WidgetSetParentWindowMethodInfo
ResolveDockStackMethod "setProperty" o = GObject.Object.ObjectSetPropertyMethodInfo
ResolveDockStackMethod "setRealized" o = Gtk.Widget.WidgetSetRealizedMethodInfo
ResolveDockStackMethod "setReallocateRedraws" o = Gtk.Container.ContainerSetReallocateRedrawsMethodInfo
ResolveDockStackMethod "setReceivesDefault" o = Gtk.Widget.WidgetSetReceivesDefaultMethodInfo
ResolveDockStackMethod "setRedrawOnAllocate" o = Gtk.Widget.WidgetSetRedrawOnAllocateMethodInfo
ResolveDockStackMethod "setResizeMode" o = Gtk.Container.ContainerSetResizeModeMethodInfo
ResolveDockStackMethod "setSensitive" o = Gtk.Widget.WidgetSetSensitiveMethodInfo
ResolveDockStackMethod "setShowPinnedButton" o = DockStackSetShowPinnedButtonMethodInfo
ResolveDockStackMethod "setSizeRequest" o = Gtk.Widget.WidgetSetSizeRequestMethodInfo
ResolveDockStackMethod "setSpacing" o = Gtk.Box.BoxSetSpacingMethodInfo
ResolveDockStackMethod "setState" o = Gtk.Widget.WidgetSetStateMethodInfo
ResolveDockStackMethod "setStateFlags" o = Gtk.Widget.WidgetSetStateFlagsMethodInfo
ResolveDockStackMethod "setStyle" o = DockStackSetStyleMethodInfo
ResolveDockStackMethod "setSupportMultidevice" o = Gtk.Widget.WidgetSetSupportMultideviceMethodInfo
ResolveDockStackMethod "setTooltipMarkup" o = Gtk.Widget.WidgetSetTooltipMarkupMethodInfo
ResolveDockStackMethod "setTooltipText" o = Gtk.Widget.WidgetSetTooltipTextMethodInfo
ResolveDockStackMethod "setTooltipWindow" o = Gtk.Widget.WidgetSetTooltipWindowMethodInfo
ResolveDockStackMethod "setValign" o = Gtk.Widget.WidgetSetValignMethodInfo
ResolveDockStackMethod "setVexpand" o = Gtk.Widget.WidgetSetVexpandMethodInfo
ResolveDockStackMethod "setVexpandSet" o = Gtk.Widget.WidgetSetVexpandSetMethodInfo
ResolveDockStackMethod "setVisible" o = Gtk.Widget.WidgetSetVisibleMethodInfo
ResolveDockStackMethod "setVisual" o = Gtk.Widget.WidgetSetVisualMethodInfo
ResolveDockStackMethod "setWindow" o = Gtk.Widget.WidgetSetWindowMethodInfo
ResolveDockStackMethod l o = O.MethodResolutionFailed l o
instance (info ~ ResolveDockStackMethod t DockStack, O.OverloadedMethod info DockStack p) => OL.IsLabel t (DockStack -> 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 ~ ResolveDockStackMethod t DockStack, O.OverloadedMethod info DockStack p, R.HasField t DockStack p) => R.HasField t DockStack p where
getField = O.overloadedMethod @info
#endif
instance (info ~ ResolveDockStackMethod t DockStack, O.OverloadedMethodInfo info DockStack) => OL.IsLabel t (O.MethodProxy info DockStack) where
#if MIN_VERSION_base(4,10,0)
fromLabel = O.MethodProxy
#else
fromLabel _ = O.MethodProxy
#endif
#endif
getDockStackEdge :: (MonadIO m, IsDockStack o) => o -> m Gtk.Enums.PositionType
getDockStackEdge :: forall (m :: * -> *) o.
(MonadIO m, IsDockStack o) =>
o -> m PositionType
getDockStackEdge o
obj = IO PositionType -> m PositionType
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO PositionType -> m PositionType)
-> IO PositionType -> m PositionType
forall a b. (a -> b) -> a -> b
$ o -> String -> IO PositionType
forall a b. (GObject a, Enum b, BoxedEnum b) => a -> String -> IO b
B.Properties.getObjectPropertyEnum o
obj String
"edge"
setDockStackEdge :: (MonadIO m, IsDockStack o) => o -> Gtk.Enums.PositionType -> m ()
setDockStackEdge :: forall (m :: * -> *) o.
(MonadIO m, IsDockStack o) =>
o -> PositionType -> m ()
setDockStackEdge o
obj PositionType
val = IO () -> m ()
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ do
o -> String -> PositionType -> IO ()
forall a b.
(GObject a, Enum b, BoxedEnum b) =>
a -> String -> b -> IO ()
B.Properties.setObjectPropertyEnum o
obj String
"edge" PositionType
val
constructDockStackEdge :: (IsDockStack o, MIO.MonadIO m) => Gtk.Enums.PositionType -> m (GValueConstruct o)
constructDockStackEdge :: forall o (m :: * -> *).
(IsDockStack o, MonadIO m) =>
PositionType -> m (GValueConstruct o)
constructDockStackEdge PositionType
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 -> PositionType -> IO (GValueConstruct o)
forall a o.
(Enum a, BoxedEnum a) =>
String -> a -> IO (GValueConstruct o)
B.Properties.constructObjectPropertyEnum String
"edge" PositionType
val
#if defined(ENABLE_OVERLOADING)
data DockStackEdgePropertyInfo
instance AttrInfo DockStackEdgePropertyInfo where
type AttrAllowedOps DockStackEdgePropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
type AttrBaseTypeConstraint DockStackEdgePropertyInfo = IsDockStack
type AttrSetTypeConstraint DockStackEdgePropertyInfo = (~) Gtk.Enums.PositionType
type AttrTransferTypeConstraint DockStackEdgePropertyInfo = (~) Gtk.Enums.PositionType
type AttrTransferType DockStackEdgePropertyInfo = Gtk.Enums.PositionType
type AttrGetType DockStackEdgePropertyInfo = Gtk.Enums.PositionType
type AttrLabel DockStackEdgePropertyInfo = "edge"
type AttrOrigin DockStackEdgePropertyInfo = DockStack
attrGet = getDockStackEdge
attrSet = setDockStackEdge
attrTransfer _ v = do
return v
attrConstruct = constructDockStackEdge
attrClear = undefined
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.DockStack.edge"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-DockStack.html#g:attr:edge"
})
#endif
getDockStackShowPinnedButton :: (MonadIO m, IsDockStack o) => o -> m Bool
getDockStackShowPinnedButton :: forall (m :: * -> *) o. (MonadIO m, IsDockStack o) => o -> m Bool
getDockStackShowPinnedButton o
obj = IO Bool -> m Bool
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO Bool -> m Bool) -> IO Bool -> m Bool
forall a b. (a -> b) -> a -> b
$ o -> String -> IO Bool
forall a. GObject a => a -> String -> IO Bool
B.Properties.getObjectPropertyBool o
obj String
"show-pinned-button"
setDockStackShowPinnedButton :: (MonadIO m, IsDockStack o) => o -> Bool -> m ()
setDockStackShowPinnedButton :: forall (m :: * -> *) o.
(MonadIO m, IsDockStack o) =>
o -> Bool -> m ()
setDockStackShowPinnedButton o
obj Bool
val = IO () -> m ()
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ do
o -> String -> Bool -> IO ()
forall a. GObject a => a -> String -> Bool -> IO ()
B.Properties.setObjectPropertyBool o
obj String
"show-pinned-button" Bool
val
constructDockStackShowPinnedButton :: (IsDockStack o, MIO.MonadIO m) => Bool -> m (GValueConstruct o)
constructDockStackShowPinnedButton :: forall o (m :: * -> *).
(IsDockStack o, MonadIO m) =>
Bool -> m (GValueConstruct o)
constructDockStackShowPinnedButton Bool
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 -> Bool -> IO (GValueConstruct o)
forall o. String -> Bool -> IO (GValueConstruct o)
B.Properties.constructObjectPropertyBool String
"show-pinned-button" Bool
val
#if defined(ENABLE_OVERLOADING)
data DockStackShowPinnedButtonPropertyInfo
instance AttrInfo DockStackShowPinnedButtonPropertyInfo where
type AttrAllowedOps DockStackShowPinnedButtonPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
type AttrBaseTypeConstraint DockStackShowPinnedButtonPropertyInfo = IsDockStack
type AttrSetTypeConstraint DockStackShowPinnedButtonPropertyInfo = (~) Bool
type AttrTransferTypeConstraint DockStackShowPinnedButtonPropertyInfo = (~) Bool
type AttrTransferType DockStackShowPinnedButtonPropertyInfo = Bool
type AttrGetType DockStackShowPinnedButtonPropertyInfo = Bool
type AttrLabel DockStackShowPinnedButtonPropertyInfo = "show-pinned-button"
type AttrOrigin DockStackShowPinnedButtonPropertyInfo = DockStack
attrGet = getDockStackShowPinnedButton
attrSet = setDockStackShowPinnedButton
attrTransfer _ v = do
return v
attrConstruct = constructDockStackShowPinnedButton
attrClear = undefined
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.DockStack.showPinnedButton"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-DockStack.html#g:attr:showPinnedButton"
})
#endif
getDockStackStyle :: (MonadIO m, IsDockStack o) => o -> m [Dazzle.Flags.TabStyle]
getDockStackStyle :: forall (m :: * -> *) o.
(MonadIO m, IsDockStack o) =>
o -> m [TabStyle]
getDockStackStyle o
obj = IO [TabStyle] -> m [TabStyle]
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO [TabStyle] -> m [TabStyle]) -> IO [TabStyle] -> m [TabStyle]
forall a b. (a -> b) -> a -> b
$ o -> String -> IO [TabStyle]
forall a b.
(GObject a, IsGFlag b, BoxedFlags b) =>
a -> String -> IO [b]
B.Properties.getObjectPropertyFlags o
obj String
"style"
setDockStackStyle :: (MonadIO m, IsDockStack o) => o -> [Dazzle.Flags.TabStyle] -> m ()
setDockStackStyle :: forall (m :: * -> *) o.
(MonadIO m, IsDockStack o) =>
o -> [TabStyle] -> m ()
setDockStackStyle o
obj [TabStyle]
val = IO () -> m ()
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ do
o -> String -> [TabStyle] -> IO ()
forall a b.
(IsGFlag b, BoxedFlags b, GObject a) =>
a -> String -> [b] -> IO ()
B.Properties.setObjectPropertyFlags o
obj String
"style" [TabStyle]
val
constructDockStackStyle :: (IsDockStack o, MIO.MonadIO m) => [Dazzle.Flags.TabStyle] -> m (GValueConstruct o)
constructDockStackStyle :: forall o (m :: * -> *).
(IsDockStack o, MonadIO m) =>
[TabStyle] -> m (GValueConstruct o)
constructDockStackStyle [TabStyle]
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 -> [TabStyle] -> IO (GValueConstruct o)
forall a o.
(IsGFlag a, BoxedFlags a) =>
String -> [a] -> IO (GValueConstruct o)
B.Properties.constructObjectPropertyFlags String
"style" [TabStyle]
val
#if defined(ENABLE_OVERLOADING)
data DockStackStylePropertyInfo
instance AttrInfo DockStackStylePropertyInfo where
type AttrAllowedOps DockStackStylePropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
type AttrBaseTypeConstraint DockStackStylePropertyInfo = IsDockStack
type AttrSetTypeConstraint DockStackStylePropertyInfo = (~) [Dazzle.Flags.TabStyle]
type AttrTransferTypeConstraint DockStackStylePropertyInfo = (~) [Dazzle.Flags.TabStyle]
type AttrTransferType DockStackStylePropertyInfo = [Dazzle.Flags.TabStyle]
type AttrGetType DockStackStylePropertyInfo = [Dazzle.Flags.TabStyle]
type AttrLabel DockStackStylePropertyInfo = "style"
type AttrOrigin DockStackStylePropertyInfo = DockStack
attrGet = getDockStackStyle
attrSet = setDockStackStyle
attrTransfer _ v = do
return v
attrConstruct = constructDockStackStyle
attrClear = undefined
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.DockStack.style"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-DockStack.html#g:attr:style"
})
#endif
#if defined(ENABLE_OVERLOADING)
instance O.HasAttributeList DockStack
type instance O.AttributeList DockStack = DockStackAttributeList
type DockStackAttributeList = ('[ '("appPaintable", Gtk.Widget.WidgetAppPaintablePropertyInfo), '("baselinePosition", Gtk.Box.BoxBaselinePositionPropertyInfo), '("borderWidth", Gtk.Container.ContainerBorderWidthPropertyInfo), '("canDefault", Gtk.Widget.WidgetCanDefaultPropertyInfo), '("canFocus", Gtk.Widget.WidgetCanFocusPropertyInfo), '("child", Gtk.Container.ContainerChildPropertyInfo), '("compositeChild", Gtk.Widget.WidgetCompositeChildPropertyInfo), '("doubleBuffered", Gtk.Widget.WidgetDoubleBufferedPropertyInfo), '("edge", DockStackEdgePropertyInfo), '("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), '("homogeneous", Gtk.Box.BoxHomogeneousPropertyInfo), '("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), '("name", Gtk.Widget.WidgetNamePropertyInfo), '("noShowAll", Gtk.Widget.WidgetNoShowAllPropertyInfo), '("opacity", Gtk.Widget.WidgetOpacityPropertyInfo), '("orientation", Gtk.Orientable.OrientableOrientationPropertyInfo), '("parent", Gtk.Widget.WidgetParentPropertyInfo), '("receivesDefault", Gtk.Widget.WidgetReceivesDefaultPropertyInfo), '("resizeMode", Gtk.Container.ContainerResizeModePropertyInfo), '("scaleFactor", Gtk.Widget.WidgetScaleFactorPropertyInfo), '("sensitive", Gtk.Widget.WidgetSensitivePropertyInfo), '("showPinnedButton", DockStackShowPinnedButtonPropertyInfo), '("spacing", Gtk.Box.BoxSpacingPropertyInfo), '("style", DockStackStylePropertyInfo), '("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)
dockStackEdge :: AttrLabelProxy "edge"
dockStackEdge = AttrLabelProxy
dockStackShowPinnedButton :: AttrLabelProxy "showPinnedButton"
dockStackShowPinnedButton = AttrLabelProxy
dockStackStyle :: AttrLabelProxy "style"
dockStackStyle = AttrLabelProxy
#endif
#if defined(ENABLE_OVERLOADING)
type instance O.SignalList DockStack = DockStackSignalList
type DockStackSignalList = ('[ '("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), '("managerSet", Dazzle.DockItem.DockItemManagerSetSignalInfo), '("map", Gtk.Widget.WidgetMapSignalInfo), '("mapEvent", Gtk.Widget.WidgetMapEventSignalInfo), '("mnemonicActivate", Gtk.Widget.WidgetMnemonicActivateSignalInfo), '("motionNotifyEvent", Gtk.Widget.WidgetMotionNotifyEventSignalInfo), '("moveFocus", Gtk.Widget.WidgetMoveFocusSignalInfo), '("needsAttention", Dazzle.DockItem.DockItemNeedsAttentionSignalInfo), '("notify", GObject.Object.ObjectNotifySignalInfo), '("parentSet", Gtk.Widget.WidgetParentSetSignalInfo), '("popupMenu", Gtk.Widget.WidgetPopupMenuSignalInfo), '("presented", Dazzle.DockItem.DockItemPresentedSignalInfo), '("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_dock_stack_new" dzl_dock_stack_new ::
IO (Ptr DockStack)
dockStackNew ::
(B.CallStack.HasCallStack, MonadIO m) =>
m DockStack
dockStackNew :: forall (m :: * -> *). (HasCallStack, MonadIO m) => m DockStack
dockStackNew = IO DockStack -> m DockStack
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO DockStack -> m DockStack) -> IO DockStack -> m DockStack
forall a b. (a -> b) -> a -> b
$ do
Ptr DockStack
result <- IO (Ptr DockStack)
dzl_dock_stack_new
Text -> Ptr DockStack -> IO ()
forall a. HasCallStack => Text -> Ptr a -> IO ()
checkUnexpectedReturnNULL Text
"dockStackNew" Ptr DockStack
result
DockStack
result' <- ((ManagedPtr DockStack -> DockStack)
-> Ptr DockStack -> IO DockStack
forall a b.
(HasCallStack, GObject a, GObject b) =>
(ManagedPtr a -> a) -> Ptr b -> IO a
newObject ManagedPtr DockStack -> DockStack
DockStack) Ptr DockStack
result
DockStack -> IO DockStack
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return DockStack
result'
#if defined(ENABLE_OVERLOADING)
#endif
foreign import ccall "dzl_dock_stack_get_edge" dzl_dock_stack_get_edge ::
Ptr DockStack ->
IO CUInt
dockStackGetEdge ::
(B.CallStack.HasCallStack, MonadIO m, IsDockStack a) =>
a
-> m Gtk.Enums.PositionType
dockStackGetEdge :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsDockStack a) =>
a -> m PositionType
dockStackGetEdge a
self = IO PositionType -> m PositionType
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO PositionType -> m PositionType)
-> IO PositionType -> m PositionType
forall a b. (a -> b) -> a -> b
$ do
Ptr DockStack
self' <- a -> IO (Ptr DockStack)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
CUInt
result <- Ptr DockStack -> IO CUInt
dzl_dock_stack_get_edge Ptr DockStack
self'
let result' :: PositionType
result' = (Int -> PositionType
forall a. Enum a => Int -> a
toEnum (Int -> PositionType) -> (CUInt -> Int) -> CUInt -> PositionType
forall b c a. (b -> c) -> (a -> b) -> a -> c
. CUInt -> Int
forall a b. (Integral a, Num b) => a -> b
fromIntegral) CUInt
result
a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
self
PositionType -> IO PositionType
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return PositionType
result'
#if defined(ENABLE_OVERLOADING)
data DockStackGetEdgeMethodInfo
instance (signature ~ (m Gtk.Enums.PositionType), MonadIO m, IsDockStack a) => O.OverloadedMethod DockStackGetEdgeMethodInfo a signature where
overloadedMethod = dockStackGetEdge
instance O.OverloadedMethodInfo DockStackGetEdgeMethodInfo a where
overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.DockStack.dockStackGetEdge",
O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-DockStack.html#v:dockStackGetEdge"
})
#endif
foreign import ccall "dzl_dock_stack_get_show_pinned_button" dzl_dock_stack_get_show_pinned_button ::
Ptr DockStack ->
IO CInt
dockStackGetShowPinnedButton ::
(B.CallStack.HasCallStack, MonadIO m, IsDockStack a) =>
a
-> m Bool
dockStackGetShowPinnedButton :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsDockStack a) =>
a -> m Bool
dockStackGetShowPinnedButton a
self = IO Bool -> m Bool
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO Bool -> m Bool) -> IO Bool -> m Bool
forall a b. (a -> b) -> a -> b
$ do
Ptr DockStack
self' <- a -> IO (Ptr DockStack)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
CInt
result <- Ptr DockStack -> IO CInt
dzl_dock_stack_get_show_pinned_button Ptr DockStack
self'
let result' :: Bool
result' = (CInt -> CInt -> Bool
forall a. Eq a => a -> a -> Bool
/= CInt
0) CInt
result
a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
self
Bool -> IO Bool
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return Bool
result'
#if defined(ENABLE_OVERLOADING)
data DockStackGetShowPinnedButtonMethodInfo
instance (signature ~ (m Bool), MonadIO m, IsDockStack a) => O.OverloadedMethod DockStackGetShowPinnedButtonMethodInfo a signature where
overloadedMethod = dockStackGetShowPinnedButton
instance O.OverloadedMethodInfo DockStackGetShowPinnedButtonMethodInfo a where
overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.DockStack.dockStackGetShowPinnedButton",
O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-DockStack.html#v:dockStackGetShowPinnedButton"
})
#endif
foreign import ccall "dzl_dock_stack_get_style" dzl_dock_stack_get_style ::
Ptr DockStack ->
IO CUInt
dockStackGetStyle ::
(B.CallStack.HasCallStack, MonadIO m, IsDockStack a) =>
a
-> m [Dazzle.Flags.TabStyle]
dockStackGetStyle :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsDockStack a) =>
a -> m [TabStyle]
dockStackGetStyle a
self = IO [TabStyle] -> m [TabStyle]
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO [TabStyle] -> m [TabStyle]) -> IO [TabStyle] -> m [TabStyle]
forall a b. (a -> b) -> a -> b
$ do
Ptr DockStack
self' <- a -> IO (Ptr DockStack)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
CUInt
result <- Ptr DockStack -> IO CUInt
dzl_dock_stack_get_style Ptr DockStack
self'
let result' :: [TabStyle]
result' = CUInt -> [TabStyle]
forall a b. (Storable a, Integral a, Bits a, IsGFlag b) => a -> [b]
wordToGFlags CUInt
result
a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
self
[TabStyle] -> IO [TabStyle]
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return [TabStyle]
result'
#if defined(ENABLE_OVERLOADING)
data DockStackGetStyleMethodInfo
instance (signature ~ (m [Dazzle.Flags.TabStyle]), MonadIO m, IsDockStack a) => O.OverloadedMethod DockStackGetStyleMethodInfo a signature where
overloadedMethod = dockStackGetStyle
instance O.OverloadedMethodInfo DockStackGetStyleMethodInfo a where
overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.DockStack.dockStackGetStyle",
O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-DockStack.html#v:dockStackGetStyle"
})
#endif
foreign import ccall "dzl_dock_stack_set_edge" dzl_dock_stack_set_edge ::
Ptr DockStack ->
CUInt ->
IO ()
dockStackSetEdge ::
(B.CallStack.HasCallStack, MonadIO m, IsDockStack a) =>
a
-> Gtk.Enums.PositionType
-> m ()
dockStackSetEdge :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsDockStack a) =>
a -> PositionType -> m ()
dockStackSetEdge a
self PositionType
edge = IO () -> m ()
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ do
Ptr DockStack
self' <- a -> IO (Ptr DockStack)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
let edge' :: CUInt
edge' = (Int -> CUInt
forall a b. (Integral a, Num b) => a -> b
fromIntegral (Int -> CUInt) -> (PositionType -> Int) -> PositionType -> CUInt
forall b c a. (b -> c) -> (a -> b) -> a -> c
. PositionType -> Int
forall a. Enum a => a -> Int
fromEnum) PositionType
edge
Ptr DockStack -> CUInt -> IO ()
dzl_dock_stack_set_edge Ptr DockStack
self' CUInt
edge'
a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
self
() -> IO ()
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return ()
#if defined(ENABLE_OVERLOADING)
data DockStackSetEdgeMethodInfo
instance (signature ~ (Gtk.Enums.PositionType -> m ()), MonadIO m, IsDockStack a) => O.OverloadedMethod DockStackSetEdgeMethodInfo a signature where
overloadedMethod = dockStackSetEdge
instance O.OverloadedMethodInfo DockStackSetEdgeMethodInfo a where
overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.DockStack.dockStackSetEdge",
O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-DockStack.html#v:dockStackSetEdge"
})
#endif
foreign import ccall "dzl_dock_stack_set_show_pinned_button" dzl_dock_stack_set_show_pinned_button ::
Ptr DockStack ->
CInt ->
IO ()
dockStackSetShowPinnedButton ::
(B.CallStack.HasCallStack, MonadIO m, IsDockStack a) =>
a
-> Bool
-> m ()
dockStackSetShowPinnedButton :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsDockStack a) =>
a -> Bool -> m ()
dockStackSetShowPinnedButton a
self Bool
showPinnedButton = IO () -> m ()
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ do
Ptr DockStack
self' <- a -> IO (Ptr DockStack)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
let showPinnedButton' :: CInt
showPinnedButton' = (Int -> CInt
forall a b. (Integral a, Num b) => a -> b
P.fromIntegral (Int -> CInt) -> (Bool -> Int) -> Bool -> CInt
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Bool -> Int
forall a. Enum a => a -> Int
P.fromEnum) Bool
showPinnedButton
Ptr DockStack -> CInt -> IO ()
dzl_dock_stack_set_show_pinned_button Ptr DockStack
self' CInt
showPinnedButton'
a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
self
() -> IO ()
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return ()
#if defined(ENABLE_OVERLOADING)
data DockStackSetShowPinnedButtonMethodInfo
instance (signature ~ (Bool -> m ()), MonadIO m, IsDockStack a) => O.OverloadedMethod DockStackSetShowPinnedButtonMethodInfo a signature where
overloadedMethod = dockStackSetShowPinnedButton
instance O.OverloadedMethodInfo DockStackSetShowPinnedButtonMethodInfo a where
overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.DockStack.dockStackSetShowPinnedButton",
O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-DockStack.html#v:dockStackSetShowPinnedButton"
})
#endif
foreign import ccall "dzl_dock_stack_set_style" dzl_dock_stack_set_style ::
Ptr DockStack ->
CUInt ->
IO ()
dockStackSetStyle ::
(B.CallStack.HasCallStack, MonadIO m, IsDockStack a) =>
a
-> [Dazzle.Flags.TabStyle]
-> m ()
dockStackSetStyle :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsDockStack a) =>
a -> [TabStyle] -> m ()
dockStackSetStyle a
self [TabStyle]
style = IO () -> m ()
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ do
Ptr DockStack
self' <- a -> IO (Ptr DockStack)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
let style' :: CUInt
style' = [TabStyle] -> CUInt
forall b a. (Num b, IsGFlag a) => [a] -> b
gflagsToWord [TabStyle]
style
Ptr DockStack -> CUInt -> IO ()
dzl_dock_stack_set_style Ptr DockStack
self' CUInt
style'
a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
self
() -> IO ()
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return ()
#if defined(ENABLE_OVERLOADING)
data DockStackSetStyleMethodInfo
instance (signature ~ ([Dazzle.Flags.TabStyle] -> m ()), MonadIO m, IsDockStack a) => O.OverloadedMethod DockStackSetStyleMethodInfo a signature where
overloadedMethod = dockStackSetStyle
instance O.OverloadedMethodInfo DockStackSetStyleMethodInfo a where
overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.DockStack.dockStackSetStyle",
O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-DockStack.html#v:dockStackSetStyle"
})
#endif