{-# LANGUAGE ImplicitParams, RankNTypes, TypeApplications #-}
#if (MIN_VERSION_haskell_gi_overloading(1,0,0) && !defined(__HADDOCK_VERSION__))
#define ENABLE_OVERLOADING
#endif
module GI.Dazzle.Objects.DockBinEdge
(
DockBinEdge(..) ,
IsDockBinEdge ,
toDockBinEdge ,
#if defined(ENABLE_OVERLOADING)
ResolveDockBinEdgeMethod ,
#endif
#if defined(ENABLE_OVERLOADING)
DockBinEdgeGetEdgeMethodInfo ,
#endif
dockBinEdgeGetEdge ,
#if defined(ENABLE_OVERLOADING)
DockBinEdgeEdgePropertyInfo ,
#endif
constructDockBinEdgeEdge ,
#if defined(ENABLE_OVERLOADING)
dockBinEdgeEdge ,
#endif
getDockBinEdgeEdge ,
setDockBinEdgeEdge ,
DockBinEdgeMoveToBinChildCallback ,
#if defined(ENABLE_OVERLOADING)
DockBinEdgeMoveToBinChildSignalInfo ,
#endif
afterDockBinEdgeMoveToBinChild ,
onDockBinEdgeMoveToBinChild ,
) 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.Enums as Dazzle.Enums
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.Bin as Dazzle.Bin
import {-# SOURCE #-} qualified GI.Dazzle.Objects.DockManager as Dazzle.DockManager
import {-# SOURCE #-} qualified GI.Dazzle.Objects.DockRevealer as Dazzle.DockRevealer
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.Objects.Bin as Gtk.Bin
import qualified GI.Gtk.Objects.Container as Gtk.Container
import qualified GI.Gtk.Objects.Widget as Gtk.Widget
#else
import qualified GI.Atk.Interfaces.ImplementorIface as Atk.ImplementorIface
import {-# SOURCE #-} qualified GI.Dazzle.Interfaces.DockItem as Dazzle.DockItem
import {-# SOURCE #-} qualified GI.Dazzle.Objects.Bin as Dazzle.Bin
import {-# SOURCE #-} qualified GI.Dazzle.Objects.DockRevealer as Dazzle.DockRevealer
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.Objects.Bin as Gtk.Bin
import qualified GI.Gtk.Objects.Container as Gtk.Container
import qualified GI.Gtk.Objects.Widget as Gtk.Widget
#endif
newtype DockBinEdge = DockBinEdge (SP.ManagedPtr DockBinEdge)
deriving (DockBinEdge -> DockBinEdge -> Bool
(DockBinEdge -> DockBinEdge -> Bool)
-> (DockBinEdge -> DockBinEdge -> Bool) -> Eq DockBinEdge
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: DockBinEdge -> DockBinEdge -> Bool
== :: DockBinEdge -> DockBinEdge -> Bool
$c/= :: DockBinEdge -> DockBinEdge -> Bool
/= :: DockBinEdge -> DockBinEdge -> Bool
Eq)
instance SP.ManagedPtrNewtype DockBinEdge where
toManagedPtr :: DockBinEdge -> ManagedPtr DockBinEdge
toManagedPtr (DockBinEdge ManagedPtr DockBinEdge
p) = ManagedPtr DockBinEdge
p
foreign import ccall "dzl_dock_bin_edge_get_type"
c_dzl_dock_bin_edge_get_type :: IO B.Types.GType
instance B.Types.TypedObject DockBinEdge where
glibType :: IO GType
glibType = IO GType
c_dzl_dock_bin_edge_get_type
instance B.Types.GObject DockBinEdge
class (SP.GObject o, O.IsDescendantOf DockBinEdge o) => IsDockBinEdge o
instance (SP.GObject o, O.IsDescendantOf DockBinEdge o) => IsDockBinEdge o
instance O.HasParentTypes DockBinEdge
type instance O.ParentTypes DockBinEdge = '[Dazzle.DockRevealer.DockRevealer, Dazzle.Bin.Bin, Gtk.Bin.Bin, Gtk.Container.Container, Gtk.Widget.Widget, GObject.Object.Object, Atk.ImplementorIface.ImplementorIface, Dazzle.DockItem.DockItem, Gtk.Buildable.Buildable]
toDockBinEdge :: (MIO.MonadIO m, IsDockBinEdge o) => o -> m DockBinEdge
toDockBinEdge :: forall (m :: * -> *) o.
(MonadIO m, IsDockBinEdge o) =>
o -> m DockBinEdge
toDockBinEdge = IO DockBinEdge -> m DockBinEdge
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO DockBinEdge -> m DockBinEdge)
-> (o -> IO DockBinEdge) -> o -> m DockBinEdge
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (ManagedPtr DockBinEdge -> DockBinEdge) -> o -> IO DockBinEdge
forall o o'.
(HasCallStack, ManagedPtrNewtype o, TypedObject o,
ManagedPtrNewtype o', TypedObject o') =>
(ManagedPtr o' -> o') -> o -> IO o'
B.ManagedPtr.unsafeCastTo ManagedPtr DockBinEdge -> DockBinEdge
DockBinEdge
instance B.GValue.IsGValue (Maybe DockBinEdge) where
gvalueGType_ :: IO GType
gvalueGType_ = IO GType
c_dzl_dock_bin_edge_get_type
gvalueSet_ :: Ptr GValue -> Maybe DockBinEdge -> IO ()
gvalueSet_ Ptr GValue
gv Maybe DockBinEdge
P.Nothing = Ptr GValue -> Ptr DockBinEdge -> IO ()
forall a. GObject a => Ptr GValue -> Ptr a -> IO ()
B.GValue.set_object Ptr GValue
gv (Ptr DockBinEdge
forall a. Ptr a
FP.nullPtr :: FP.Ptr DockBinEdge)
gvalueSet_ Ptr GValue
gv (P.Just DockBinEdge
obj) = DockBinEdge -> (Ptr DockBinEdge -> IO ()) -> IO ()
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
B.ManagedPtr.withManagedPtr DockBinEdge
obj (Ptr GValue -> Ptr DockBinEdge -> IO ()
forall a. GObject a => Ptr GValue -> Ptr a -> IO ()
B.GValue.set_object Ptr GValue
gv)
gvalueGet_ :: Ptr GValue -> IO (Maybe DockBinEdge)
gvalueGet_ Ptr GValue
gv = do
Ptr DockBinEdge
ptr <- Ptr GValue -> IO (Ptr DockBinEdge)
forall a. GObject a => Ptr GValue -> IO (Ptr a)
B.GValue.get_object Ptr GValue
gv :: IO (FP.Ptr DockBinEdge)
if Ptr DockBinEdge
ptr Ptr DockBinEdge -> Ptr DockBinEdge -> Bool
forall a. Eq a => a -> a -> Bool
/= Ptr DockBinEdge
forall a. Ptr a
FP.nullPtr
then DockBinEdge -> Maybe DockBinEdge
forall a. a -> Maybe a
P.Just (DockBinEdge -> Maybe DockBinEdge)
-> IO DockBinEdge -> IO (Maybe DockBinEdge)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (ManagedPtr DockBinEdge -> DockBinEdge)
-> Ptr DockBinEdge -> IO DockBinEdge
forall a b.
(HasCallStack, GObject a, GObject b) =>
(ManagedPtr a -> a) -> Ptr b -> IO a
B.ManagedPtr.newObject ManagedPtr DockBinEdge -> DockBinEdge
DockBinEdge Ptr DockBinEdge
ptr
else Maybe DockBinEdge -> IO (Maybe DockBinEdge)
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return Maybe DockBinEdge
forall a. Maybe a
P.Nothing
#if defined(ENABLE_OVERLOADING)
type family ResolveDockBinEdgeMethod (t :: Symbol) (o :: DK.Type) :: DK.Type where
ResolveDockBinEdgeMethod "activate" o = Gtk.Widget.WidgetActivateMethodInfo
ResolveDockBinEdgeMethod "add" o = Gtk.Container.ContainerAddMethodInfo
ResolveDockBinEdgeMethod "addAccelerator" o = Gtk.Widget.WidgetAddAcceleratorMethodInfo
ResolveDockBinEdgeMethod "addChild" o = Gtk.Buildable.BuildableAddChildMethodInfo
ResolveDockBinEdgeMethod "addDeviceEvents" o = Gtk.Widget.WidgetAddDeviceEventsMethodInfo
ResolveDockBinEdgeMethod "addEvents" o = Gtk.Widget.WidgetAddEventsMethodInfo
ResolveDockBinEdgeMethod "addMnemonicLabel" o = Gtk.Widget.WidgetAddMnemonicLabelMethodInfo
ResolveDockBinEdgeMethod "addTickCallback" o = Gtk.Widget.WidgetAddTickCallbackMethodInfo
ResolveDockBinEdgeMethod "adopt" o = Dazzle.DockItem.DockItemAdoptMethodInfo
ResolveDockBinEdgeMethod "animateToPosition" o = Dazzle.DockRevealer.DockRevealerAnimateToPositionMethodInfo
ResolveDockBinEdgeMethod "bindProperty" o = GObject.Object.ObjectBindPropertyMethodInfo
ResolveDockBinEdgeMethod "bindPropertyFull" o = GObject.Object.ObjectBindPropertyFullMethodInfo
ResolveDockBinEdgeMethod "canActivateAccel" o = Gtk.Widget.WidgetCanActivateAccelMethodInfo
ResolveDockBinEdgeMethod "checkResize" o = Gtk.Container.ContainerCheckResizeMethodInfo
ResolveDockBinEdgeMethod "childFocus" o = Gtk.Widget.WidgetChildFocusMethodInfo
ResolveDockBinEdgeMethod "childGetProperty" o = Gtk.Container.ContainerChildGetPropertyMethodInfo
ResolveDockBinEdgeMethod "childNotify" o = Gtk.Container.ContainerChildNotifyMethodInfo
ResolveDockBinEdgeMethod "childNotifyByPspec" o = Gtk.Container.ContainerChildNotifyByPspecMethodInfo
ResolveDockBinEdgeMethod "childSetProperty" o = Gtk.Container.ContainerChildSetPropertyMethodInfo
ResolveDockBinEdgeMethod "childType" o = Gtk.Container.ContainerChildTypeMethodInfo
ResolveDockBinEdgeMethod "classPath" o = Gtk.Widget.WidgetClassPathMethodInfo
ResolveDockBinEdgeMethod "close" o = Dazzle.DockItem.DockItemCloseMethodInfo
ResolveDockBinEdgeMethod "computeExpand" o = Gtk.Widget.WidgetComputeExpandMethodInfo
ResolveDockBinEdgeMethod "constructChild" o = Gtk.Buildable.BuildableConstructChildMethodInfo
ResolveDockBinEdgeMethod "createPangoContext" o = Gtk.Widget.WidgetCreatePangoContextMethodInfo
ResolveDockBinEdgeMethod "createPangoLayout" o = Gtk.Widget.WidgetCreatePangoLayoutMethodInfo
ResolveDockBinEdgeMethod "customFinished" o = Gtk.Buildable.BuildableCustomFinishedMethodInfo
ResolveDockBinEdgeMethod "customTagEnd" o = Gtk.Buildable.BuildableCustomTagEndMethodInfo
ResolveDockBinEdgeMethod "customTagStart" o = Gtk.Buildable.BuildableCustomTagStartMethodInfo
ResolveDockBinEdgeMethod "destroy" o = Gtk.Widget.WidgetDestroyMethodInfo
ResolveDockBinEdgeMethod "destroyed" o = Gtk.Widget.WidgetDestroyedMethodInfo
ResolveDockBinEdgeMethod "deviceIsShadowed" o = Gtk.Widget.WidgetDeviceIsShadowedMethodInfo
ResolveDockBinEdgeMethod "dragBegin" o = Gtk.Widget.WidgetDragBeginMethodInfo
ResolveDockBinEdgeMethod "dragBeginWithCoordinates" o = Gtk.Widget.WidgetDragBeginWithCoordinatesMethodInfo
ResolveDockBinEdgeMethod "dragCheckThreshold" o = Gtk.Widget.WidgetDragCheckThresholdMethodInfo
ResolveDockBinEdgeMethod "dragDestAddImageTargets" o = Gtk.Widget.WidgetDragDestAddImageTargetsMethodInfo
ResolveDockBinEdgeMethod "dragDestAddTextTargets" o = Gtk.Widget.WidgetDragDestAddTextTargetsMethodInfo
ResolveDockBinEdgeMethod "dragDestAddUriTargets" o = Gtk.Widget.WidgetDragDestAddUriTargetsMethodInfo
ResolveDockBinEdgeMethod "dragDestFindTarget" o = Gtk.Widget.WidgetDragDestFindTargetMethodInfo
ResolveDockBinEdgeMethod "dragDestGetTargetList" o = Gtk.Widget.WidgetDragDestGetTargetListMethodInfo
ResolveDockBinEdgeMethod "dragDestGetTrackMotion" o = Gtk.Widget.WidgetDragDestGetTrackMotionMethodInfo
ResolveDockBinEdgeMethod "dragDestSet" o = Gtk.Widget.WidgetDragDestSetMethodInfo
ResolveDockBinEdgeMethod "dragDestSetProxy" o = Gtk.Widget.WidgetDragDestSetProxyMethodInfo
ResolveDockBinEdgeMethod "dragDestSetTargetList" o = Gtk.Widget.WidgetDragDestSetTargetListMethodInfo
ResolveDockBinEdgeMethod "dragDestSetTrackMotion" o = Gtk.Widget.WidgetDragDestSetTrackMotionMethodInfo
ResolveDockBinEdgeMethod "dragDestUnset" o = Gtk.Widget.WidgetDragDestUnsetMethodInfo
ResolveDockBinEdgeMethod "dragGetData" o = Gtk.Widget.WidgetDragGetDataMethodInfo
ResolveDockBinEdgeMethod "dragHighlight" o = Gtk.Widget.WidgetDragHighlightMethodInfo
ResolveDockBinEdgeMethod "dragSourceAddImageTargets" o = Gtk.Widget.WidgetDragSourceAddImageTargetsMethodInfo
ResolveDockBinEdgeMethod "dragSourceAddTextTargets" o = Gtk.Widget.WidgetDragSourceAddTextTargetsMethodInfo
ResolveDockBinEdgeMethod "dragSourceAddUriTargets" o = Gtk.Widget.WidgetDragSourceAddUriTargetsMethodInfo
ResolveDockBinEdgeMethod "dragSourceGetTargetList" o = Gtk.Widget.WidgetDragSourceGetTargetListMethodInfo
ResolveDockBinEdgeMethod "dragSourceSet" o = Gtk.Widget.WidgetDragSourceSetMethodInfo
ResolveDockBinEdgeMethod "dragSourceSetIconGicon" o = Gtk.Widget.WidgetDragSourceSetIconGiconMethodInfo
ResolveDockBinEdgeMethod "dragSourceSetIconName" o = Gtk.Widget.WidgetDragSourceSetIconNameMethodInfo
ResolveDockBinEdgeMethod "dragSourceSetIconPixbuf" o = Gtk.Widget.WidgetDragSourceSetIconPixbufMethodInfo
ResolveDockBinEdgeMethod "dragSourceSetIconStock" o = Gtk.Widget.WidgetDragSourceSetIconStockMethodInfo
ResolveDockBinEdgeMethod "dragSourceSetTargetList" o = Gtk.Widget.WidgetDragSourceSetTargetListMethodInfo
ResolveDockBinEdgeMethod "dragSourceUnset" o = Gtk.Widget.WidgetDragSourceUnsetMethodInfo
ResolveDockBinEdgeMethod "dragUnhighlight" o = Gtk.Widget.WidgetDragUnhighlightMethodInfo
ResolveDockBinEdgeMethod "draw" o = Gtk.Widget.WidgetDrawMethodInfo
ResolveDockBinEdgeMethod "emitPresented" o = Dazzle.DockItem.DockItemEmitPresentedMethodInfo
ResolveDockBinEdgeMethod "ensureStyle" o = Gtk.Widget.WidgetEnsureStyleMethodInfo
ResolveDockBinEdgeMethod "errorBell" o = Gtk.Widget.WidgetErrorBellMethodInfo
ResolveDockBinEdgeMethod "event" o = Gtk.Widget.WidgetEventMethodInfo
ResolveDockBinEdgeMethod "forall" o = Gtk.Container.ContainerForallMethodInfo
ResolveDockBinEdgeMethod "forceFloating" o = GObject.Object.ObjectForceFloatingMethodInfo
ResolveDockBinEdgeMethod "foreach" o = Gtk.Container.ContainerForeachMethodInfo
ResolveDockBinEdgeMethod "freezeChildNotify" o = Gtk.Widget.WidgetFreezeChildNotifyMethodInfo
ResolveDockBinEdgeMethod "freezeNotify" o = GObject.Object.ObjectFreezeNotifyMethodInfo
ResolveDockBinEdgeMethod "getv" o = GObject.Object.ObjectGetvMethodInfo
ResolveDockBinEdgeMethod "grabAdd" o = Gtk.Widget.WidgetGrabAddMethodInfo
ResolveDockBinEdgeMethod "grabDefault" o = Gtk.Widget.WidgetGrabDefaultMethodInfo
ResolveDockBinEdgeMethod "grabFocus" o = Gtk.Widget.WidgetGrabFocusMethodInfo
ResolveDockBinEdgeMethod "grabRemove" o = Gtk.Widget.WidgetGrabRemoveMethodInfo
ResolveDockBinEdgeMethod "hasDefault" o = Gtk.Widget.WidgetHasDefaultMethodInfo
ResolveDockBinEdgeMethod "hasFocus" o = Gtk.Widget.WidgetHasFocusMethodInfo
ResolveDockBinEdgeMethod "hasGrab" o = Gtk.Widget.WidgetHasGrabMethodInfo
ResolveDockBinEdgeMethod "hasRcStyle" o = Gtk.Widget.WidgetHasRcStyleMethodInfo
ResolveDockBinEdgeMethod "hasScreen" o = Gtk.Widget.WidgetHasScreenMethodInfo
ResolveDockBinEdgeMethod "hasVisibleFocus" o = Gtk.Widget.WidgetHasVisibleFocusMethodInfo
ResolveDockBinEdgeMethod "hasWidgets" o = Dazzle.DockItem.DockItemHasWidgetsMethodInfo
ResolveDockBinEdgeMethod "hide" o = Gtk.Widget.WidgetHideMethodInfo
ResolveDockBinEdgeMethod "hideOnDelete" o = Gtk.Widget.WidgetHideOnDeleteMethodInfo
ResolveDockBinEdgeMethod "inDestruction" o = Gtk.Widget.WidgetInDestructionMethodInfo
ResolveDockBinEdgeMethod "initTemplate" o = Gtk.Widget.WidgetInitTemplateMethodInfo
ResolveDockBinEdgeMethod "inputShapeCombineRegion" o = Gtk.Widget.WidgetInputShapeCombineRegionMethodInfo
ResolveDockBinEdgeMethod "insertActionGroup" o = Gtk.Widget.WidgetInsertActionGroupMethodInfo
ResolveDockBinEdgeMethod "intersect" o = Gtk.Widget.WidgetIntersectMethodInfo
ResolveDockBinEdgeMethod "isAncestor" o = Gtk.Widget.WidgetIsAncestorMethodInfo
ResolveDockBinEdgeMethod "isAnimating" o = Dazzle.DockRevealer.DockRevealerIsAnimatingMethodInfo
ResolveDockBinEdgeMethod "isComposited" o = Gtk.Widget.WidgetIsCompositedMethodInfo
ResolveDockBinEdgeMethod "isDrawable" o = Gtk.Widget.WidgetIsDrawableMethodInfo
ResolveDockBinEdgeMethod "isFloating" o = GObject.Object.ObjectIsFloatingMethodInfo
ResolveDockBinEdgeMethod "isFocus" o = Gtk.Widget.WidgetIsFocusMethodInfo
ResolveDockBinEdgeMethod "isSensitive" o = Gtk.Widget.WidgetIsSensitiveMethodInfo
ResolveDockBinEdgeMethod "isToplevel" o = Gtk.Widget.WidgetIsToplevelMethodInfo
ResolveDockBinEdgeMethod "isVisible" o = Gtk.Widget.WidgetIsVisibleMethodInfo
ResolveDockBinEdgeMethod "keynavFailed" o = Gtk.Widget.WidgetKeynavFailedMethodInfo
ResolveDockBinEdgeMethod "listAccelClosures" o = Gtk.Widget.WidgetListAccelClosuresMethodInfo
ResolveDockBinEdgeMethod "listActionPrefixes" o = Gtk.Widget.WidgetListActionPrefixesMethodInfo
ResolveDockBinEdgeMethod "listMnemonicLabels" o = Gtk.Widget.WidgetListMnemonicLabelsMethodInfo
ResolveDockBinEdgeMethod "map" o = Gtk.Widget.WidgetMapMethodInfo
ResolveDockBinEdgeMethod "minimize" o = Dazzle.DockItem.DockItemMinimizeMethodInfo
ResolveDockBinEdgeMethod "mnemonicActivate" o = Gtk.Widget.WidgetMnemonicActivateMethodInfo
ResolveDockBinEdgeMethod "modifyBase" o = Gtk.Widget.WidgetModifyBaseMethodInfo
ResolveDockBinEdgeMethod "modifyBg" o = Gtk.Widget.WidgetModifyBgMethodInfo
ResolveDockBinEdgeMethod "modifyCursor" o = Gtk.Widget.WidgetModifyCursorMethodInfo
ResolveDockBinEdgeMethod "modifyFg" o = Gtk.Widget.WidgetModifyFgMethodInfo
ResolveDockBinEdgeMethod "modifyFont" o = Gtk.Widget.WidgetModifyFontMethodInfo
ResolveDockBinEdgeMethod "modifyStyle" o = Gtk.Widget.WidgetModifyStyleMethodInfo
ResolveDockBinEdgeMethod "modifyText" o = Gtk.Widget.WidgetModifyTextMethodInfo
ResolveDockBinEdgeMethod "needsAttention" o = Dazzle.DockItem.DockItemNeedsAttentionMethodInfo
ResolveDockBinEdgeMethod "notify" o = GObject.Object.ObjectNotifyMethodInfo
ResolveDockBinEdgeMethod "notifyByPspec" o = GObject.Object.ObjectNotifyByPspecMethodInfo
ResolveDockBinEdgeMethod "overrideBackgroundColor" o = Gtk.Widget.WidgetOverrideBackgroundColorMethodInfo
ResolveDockBinEdgeMethod "overrideColor" o = Gtk.Widget.WidgetOverrideColorMethodInfo
ResolveDockBinEdgeMethod "overrideCursor" o = Gtk.Widget.WidgetOverrideCursorMethodInfo
ResolveDockBinEdgeMethod "overrideFont" o = Gtk.Widget.WidgetOverrideFontMethodInfo
ResolveDockBinEdgeMethod "overrideSymbolicColor" o = Gtk.Widget.WidgetOverrideSymbolicColorMethodInfo
ResolveDockBinEdgeMethod "parserFinished" o = Gtk.Buildable.BuildableParserFinishedMethodInfo
ResolveDockBinEdgeMethod "path" o = Gtk.Widget.WidgetPathMethodInfo
ResolveDockBinEdgeMethod "present" o = Dazzle.DockItem.DockItemPresentMethodInfo
ResolveDockBinEdgeMethod "presentChild" o = Dazzle.DockItem.DockItemPresentChildMethodInfo
ResolveDockBinEdgeMethod "propagateDraw" o = Gtk.Container.ContainerPropagateDrawMethodInfo
ResolveDockBinEdgeMethod "queueAllocate" o = Gtk.Widget.WidgetQueueAllocateMethodInfo
ResolveDockBinEdgeMethod "queueComputeExpand" o = Gtk.Widget.WidgetQueueComputeExpandMethodInfo
ResolveDockBinEdgeMethod "queueDraw" o = Gtk.Widget.WidgetQueueDrawMethodInfo
ResolveDockBinEdgeMethod "queueDrawArea" o = Gtk.Widget.WidgetQueueDrawAreaMethodInfo
ResolveDockBinEdgeMethod "queueDrawRegion" o = Gtk.Widget.WidgetQueueDrawRegionMethodInfo
ResolveDockBinEdgeMethod "queueResize" o = Gtk.Widget.WidgetQueueResizeMethodInfo
ResolveDockBinEdgeMethod "queueResizeNoRedraw" o = Gtk.Widget.WidgetQueueResizeNoRedrawMethodInfo
ResolveDockBinEdgeMethod "realize" o = Gtk.Widget.WidgetRealizeMethodInfo
ResolveDockBinEdgeMethod "ref" o = GObject.Object.ObjectRefMethodInfo
ResolveDockBinEdgeMethod "refGicon" o = Dazzle.DockItem.DockItemRefGiconMethodInfo
ResolveDockBinEdgeMethod "refSink" o = GObject.Object.ObjectRefSinkMethodInfo
ResolveDockBinEdgeMethod "regionIntersect" o = Gtk.Widget.WidgetRegionIntersectMethodInfo
ResolveDockBinEdgeMethod "registerWindow" o = Gtk.Widget.WidgetRegisterWindowMethodInfo
ResolveDockBinEdgeMethod "release" o = Dazzle.DockItem.DockItemReleaseMethodInfo
ResolveDockBinEdgeMethod "remove" o = Gtk.Container.ContainerRemoveMethodInfo
ResolveDockBinEdgeMethod "removeAccelerator" o = Gtk.Widget.WidgetRemoveAcceleratorMethodInfo
ResolveDockBinEdgeMethod "removeMnemonicLabel" o = Gtk.Widget.WidgetRemoveMnemonicLabelMethodInfo
ResolveDockBinEdgeMethod "removeTickCallback" o = Gtk.Widget.WidgetRemoveTickCallbackMethodInfo
ResolveDockBinEdgeMethod "renderIcon" o = Gtk.Widget.WidgetRenderIconMethodInfo
ResolveDockBinEdgeMethod "renderIconPixbuf" o = Gtk.Widget.WidgetRenderIconPixbufMethodInfo
ResolveDockBinEdgeMethod "reparent" o = Gtk.Widget.WidgetReparentMethodInfo
ResolveDockBinEdgeMethod "resetRcStyles" o = Gtk.Widget.WidgetResetRcStylesMethodInfo
ResolveDockBinEdgeMethod "resetStyle" o = Gtk.Widget.WidgetResetStyleMethodInfo
ResolveDockBinEdgeMethod "resizeChildren" o = Gtk.Container.ContainerResizeChildrenMethodInfo
ResolveDockBinEdgeMethod "runDispose" o = GObject.Object.ObjectRunDisposeMethodInfo
ResolveDockBinEdgeMethod "sendExpose" o = Gtk.Widget.WidgetSendExposeMethodInfo
ResolveDockBinEdgeMethod "sendFocusChange" o = Gtk.Widget.WidgetSendFocusChangeMethodInfo
ResolveDockBinEdgeMethod "shapeCombineRegion" o = Gtk.Widget.WidgetShapeCombineRegionMethodInfo
ResolveDockBinEdgeMethod "show" o = Gtk.Widget.WidgetShowMethodInfo
ResolveDockBinEdgeMethod "showAll" o = Gtk.Widget.WidgetShowAllMethodInfo
ResolveDockBinEdgeMethod "showNow" o = Gtk.Widget.WidgetShowNowMethodInfo
ResolveDockBinEdgeMethod "sizeAllocate" o = Gtk.Widget.WidgetSizeAllocateMethodInfo
ResolveDockBinEdgeMethod "sizeAllocateWithBaseline" o = Gtk.Widget.WidgetSizeAllocateWithBaselineMethodInfo
ResolveDockBinEdgeMethod "sizeRequest" o = Gtk.Widget.WidgetSizeRequestMethodInfo
ResolveDockBinEdgeMethod "stealData" o = GObject.Object.ObjectStealDataMethodInfo
ResolveDockBinEdgeMethod "stealQdata" o = GObject.Object.ObjectStealQdataMethodInfo
ResolveDockBinEdgeMethod "styleAttach" o = Gtk.Widget.WidgetStyleAttachMethodInfo
ResolveDockBinEdgeMethod "styleGetProperty" o = Gtk.Widget.WidgetStyleGetPropertyMethodInfo
ResolveDockBinEdgeMethod "thawChildNotify" o = Gtk.Widget.WidgetThawChildNotifyMethodInfo
ResolveDockBinEdgeMethod "thawNotify" o = GObject.Object.ObjectThawNotifyMethodInfo
ResolveDockBinEdgeMethod "translateCoordinates" o = Gtk.Widget.WidgetTranslateCoordinatesMethodInfo
ResolveDockBinEdgeMethod "triggerTooltipQuery" o = Gtk.Widget.WidgetTriggerTooltipQueryMethodInfo
ResolveDockBinEdgeMethod "unmap" o = Gtk.Widget.WidgetUnmapMethodInfo
ResolveDockBinEdgeMethod "unparent" o = Gtk.Widget.WidgetUnparentMethodInfo
ResolveDockBinEdgeMethod "unrealize" o = Gtk.Widget.WidgetUnrealizeMethodInfo
ResolveDockBinEdgeMethod "unref" o = GObject.Object.ObjectUnrefMethodInfo
ResolveDockBinEdgeMethod "unregisterWindow" o = Gtk.Widget.WidgetUnregisterWindowMethodInfo
ResolveDockBinEdgeMethod "unsetFocusChain" o = Gtk.Container.ContainerUnsetFocusChainMethodInfo
ResolveDockBinEdgeMethod "unsetStateFlags" o = Gtk.Widget.WidgetUnsetStateFlagsMethodInfo
ResolveDockBinEdgeMethod "updateVisibility" o = Dazzle.DockItem.DockItemUpdateVisibilityMethodInfo
ResolveDockBinEdgeMethod "watchClosure" o = GObject.Object.ObjectWatchClosureMethodInfo
ResolveDockBinEdgeMethod "getAccessible" o = Gtk.Widget.WidgetGetAccessibleMethodInfo
ResolveDockBinEdgeMethod "getActionGroup" o = Gtk.Widget.WidgetGetActionGroupMethodInfo
ResolveDockBinEdgeMethod "getAllocatedBaseline" o = Gtk.Widget.WidgetGetAllocatedBaselineMethodInfo
ResolveDockBinEdgeMethod "getAllocatedHeight" o = Gtk.Widget.WidgetGetAllocatedHeightMethodInfo
ResolveDockBinEdgeMethod "getAllocatedSize" o = Gtk.Widget.WidgetGetAllocatedSizeMethodInfo
ResolveDockBinEdgeMethod "getAllocatedWidth" o = Gtk.Widget.WidgetGetAllocatedWidthMethodInfo
ResolveDockBinEdgeMethod "getAllocation" o = Gtk.Widget.WidgetGetAllocationMethodInfo
ResolveDockBinEdgeMethod "getAncestor" o = Gtk.Widget.WidgetGetAncestorMethodInfo
ResolveDockBinEdgeMethod "getAppPaintable" o = Gtk.Widget.WidgetGetAppPaintableMethodInfo
ResolveDockBinEdgeMethod "getBorderWidth" o = Gtk.Container.ContainerGetBorderWidthMethodInfo
ResolveDockBinEdgeMethod "getCanClose" o = Dazzle.DockItem.DockItemGetCanCloseMethodInfo
ResolveDockBinEdgeMethod "getCanDefault" o = Gtk.Widget.WidgetGetCanDefaultMethodInfo
ResolveDockBinEdgeMethod "getCanFocus" o = Gtk.Widget.WidgetGetCanFocusMethodInfo
ResolveDockBinEdgeMethod "getCanMinimize" o = Dazzle.DockItem.DockItemGetCanMinimizeMethodInfo
ResolveDockBinEdgeMethod "getChild" o = Gtk.Bin.BinGetChildMethodInfo
ResolveDockBinEdgeMethod "getChildRequisition" o = Gtk.Widget.WidgetGetChildRequisitionMethodInfo
ResolveDockBinEdgeMethod "getChildRevealed" o = Dazzle.DockRevealer.DockRevealerGetChildRevealedMethodInfo
ResolveDockBinEdgeMethod "getChildVisible" o = Gtk.Widget.WidgetGetChildVisibleMethodInfo
ResolveDockBinEdgeMethod "getChildren" o = Gtk.Container.ContainerGetChildrenMethodInfo
ResolveDockBinEdgeMethod "getClip" o = Gtk.Widget.WidgetGetClipMethodInfo
ResolveDockBinEdgeMethod "getClipboard" o = Gtk.Widget.WidgetGetClipboardMethodInfo
ResolveDockBinEdgeMethod "getCompositeName" o = Gtk.Widget.WidgetGetCompositeNameMethodInfo
ResolveDockBinEdgeMethod "getData" o = GObject.Object.ObjectGetDataMethodInfo
ResolveDockBinEdgeMethod "getDeviceEnabled" o = Gtk.Widget.WidgetGetDeviceEnabledMethodInfo
ResolveDockBinEdgeMethod "getDeviceEvents" o = Gtk.Widget.WidgetGetDeviceEventsMethodInfo
ResolveDockBinEdgeMethod "getDirection" o = Gtk.Widget.WidgetGetDirectionMethodInfo
ResolveDockBinEdgeMethod "getDisplay" o = Gtk.Widget.WidgetGetDisplayMethodInfo
ResolveDockBinEdgeMethod "getDoubleBuffered" o = Gtk.Widget.WidgetGetDoubleBufferedMethodInfo
ResolveDockBinEdgeMethod "getEdge" o = DockBinEdgeGetEdgeMethodInfo
ResolveDockBinEdgeMethod "getEvents" o = Gtk.Widget.WidgetGetEventsMethodInfo
ResolveDockBinEdgeMethod "getFocusChain" o = Gtk.Container.ContainerGetFocusChainMethodInfo
ResolveDockBinEdgeMethod "getFocusChild" o = Gtk.Container.ContainerGetFocusChildMethodInfo
ResolveDockBinEdgeMethod "getFocusHadjustment" o = Gtk.Container.ContainerGetFocusHadjustmentMethodInfo
ResolveDockBinEdgeMethod "getFocusOnClick" o = Gtk.Widget.WidgetGetFocusOnClickMethodInfo
ResolveDockBinEdgeMethod "getFocusVadjustment" o = Gtk.Container.ContainerGetFocusVadjustmentMethodInfo
ResolveDockBinEdgeMethod "getFontMap" o = Gtk.Widget.WidgetGetFontMapMethodInfo
ResolveDockBinEdgeMethod "getFontOptions" o = Gtk.Widget.WidgetGetFontOptionsMethodInfo
ResolveDockBinEdgeMethod "getFrameClock" o = Gtk.Widget.WidgetGetFrameClockMethodInfo
ResolveDockBinEdgeMethod "getHalign" o = Gtk.Widget.WidgetGetHalignMethodInfo
ResolveDockBinEdgeMethod "getHasTooltip" o = Gtk.Widget.WidgetGetHasTooltipMethodInfo
ResolveDockBinEdgeMethod "getHasWindow" o = Gtk.Widget.WidgetGetHasWindowMethodInfo
ResolveDockBinEdgeMethod "getHexpand" o = Gtk.Widget.WidgetGetHexpandMethodInfo
ResolveDockBinEdgeMethod "getHexpandSet" o = Gtk.Widget.WidgetGetHexpandSetMethodInfo
ResolveDockBinEdgeMethod "getIconName" o = Dazzle.DockItem.DockItemGetIconNameMethodInfo
ResolveDockBinEdgeMethod "getInternalChild" o = Gtk.Buildable.BuildableGetInternalChildMethodInfo
ResolveDockBinEdgeMethod "getManager" o = Dazzle.DockItem.DockItemGetManagerMethodInfo
ResolveDockBinEdgeMethod "getMapped" o = Gtk.Widget.WidgetGetMappedMethodInfo
ResolveDockBinEdgeMethod "getMarginBottom" o = Gtk.Widget.WidgetGetMarginBottomMethodInfo
ResolveDockBinEdgeMethod "getMarginEnd" o = Gtk.Widget.WidgetGetMarginEndMethodInfo
ResolveDockBinEdgeMethod "getMarginLeft" o = Gtk.Widget.WidgetGetMarginLeftMethodInfo
ResolveDockBinEdgeMethod "getMarginRight" o = Gtk.Widget.WidgetGetMarginRightMethodInfo
ResolveDockBinEdgeMethod "getMarginStart" o = Gtk.Widget.WidgetGetMarginStartMethodInfo
ResolveDockBinEdgeMethod "getMarginTop" o = Gtk.Widget.WidgetGetMarginTopMethodInfo
ResolveDockBinEdgeMethod "getModifierMask" o = Gtk.Widget.WidgetGetModifierMaskMethodInfo
ResolveDockBinEdgeMethod "getModifierStyle" o = Gtk.Widget.WidgetGetModifierStyleMethodInfo
ResolveDockBinEdgeMethod "getName" o = Gtk.Widget.WidgetGetNameMethodInfo
ResolveDockBinEdgeMethod "getNoShowAll" o = Gtk.Widget.WidgetGetNoShowAllMethodInfo
ResolveDockBinEdgeMethod "getOpacity" o = Gtk.Widget.WidgetGetOpacityMethodInfo
ResolveDockBinEdgeMethod "getPangoContext" o = Gtk.Widget.WidgetGetPangoContextMethodInfo
ResolveDockBinEdgeMethod "getParent" o = Gtk.Widget.WidgetGetParentMethodInfo
ResolveDockBinEdgeMethod "getParentWindow" o = Gtk.Widget.WidgetGetParentWindowMethodInfo
ResolveDockBinEdgeMethod "getPath" o = Gtk.Widget.WidgetGetPathMethodInfo
ResolveDockBinEdgeMethod "getPathForChild" o = Gtk.Container.ContainerGetPathForChildMethodInfo
ResolveDockBinEdgeMethod "getPointer" o = Gtk.Widget.WidgetGetPointerMethodInfo
ResolveDockBinEdgeMethod "getPosition" o = Dazzle.DockRevealer.DockRevealerGetPositionMethodInfo
ResolveDockBinEdgeMethod "getPositionSet" o = Dazzle.DockRevealer.DockRevealerGetPositionSetMethodInfo
ResolveDockBinEdgeMethod "getPreferredHeight" o = Gtk.Widget.WidgetGetPreferredHeightMethodInfo
ResolveDockBinEdgeMethod "getPreferredHeightAndBaselineForWidth" o = Gtk.Widget.WidgetGetPreferredHeightAndBaselineForWidthMethodInfo
ResolveDockBinEdgeMethod "getPreferredHeightForWidth" o = Gtk.Widget.WidgetGetPreferredHeightForWidthMethodInfo
ResolveDockBinEdgeMethod "getPreferredSize" o = Gtk.Widget.WidgetGetPreferredSizeMethodInfo
ResolveDockBinEdgeMethod "getPreferredWidth" o = Gtk.Widget.WidgetGetPreferredWidthMethodInfo
ResolveDockBinEdgeMethod "getPreferredWidthForHeight" o = Gtk.Widget.WidgetGetPreferredWidthForHeightMethodInfo
ResolveDockBinEdgeMethod "getProperty" o = GObject.Object.ObjectGetPropertyMethodInfo
ResolveDockBinEdgeMethod "getQdata" o = GObject.Object.ObjectGetQdataMethodInfo
ResolveDockBinEdgeMethod "getRealized" o = Gtk.Widget.WidgetGetRealizedMethodInfo
ResolveDockBinEdgeMethod "getReceivesDefault" o = Gtk.Widget.WidgetGetReceivesDefaultMethodInfo
ResolveDockBinEdgeMethod "getRequestMode" o = Gtk.Widget.WidgetGetRequestModeMethodInfo
ResolveDockBinEdgeMethod "getRequisition" o = Gtk.Widget.WidgetGetRequisitionMethodInfo
ResolveDockBinEdgeMethod "getResizeMode" o = Gtk.Container.ContainerGetResizeModeMethodInfo
ResolveDockBinEdgeMethod "getRevealChild" o = Dazzle.DockRevealer.DockRevealerGetRevealChildMethodInfo
ResolveDockBinEdgeMethod "getRootWindow" o = Gtk.Widget.WidgetGetRootWindowMethodInfo
ResolveDockBinEdgeMethod "getScaleFactor" o = Gtk.Widget.WidgetGetScaleFactorMethodInfo
ResolveDockBinEdgeMethod "getScreen" o = Gtk.Widget.WidgetGetScreenMethodInfo
ResolveDockBinEdgeMethod "getSensitive" o = Gtk.Widget.WidgetGetSensitiveMethodInfo
ResolveDockBinEdgeMethod "getSettings" o = Gtk.Widget.WidgetGetSettingsMethodInfo
ResolveDockBinEdgeMethod "getSizeRequest" o = Gtk.Widget.WidgetGetSizeRequestMethodInfo
ResolveDockBinEdgeMethod "getState" o = Gtk.Widget.WidgetGetStateMethodInfo
ResolveDockBinEdgeMethod "getStateFlags" o = Gtk.Widget.WidgetGetStateFlagsMethodInfo
ResolveDockBinEdgeMethod "getStyle" o = Gtk.Widget.WidgetGetStyleMethodInfo
ResolveDockBinEdgeMethod "getStyleContext" o = Gtk.Widget.WidgetGetStyleContextMethodInfo
ResolveDockBinEdgeMethod "getSupportMultidevice" o = Gtk.Widget.WidgetGetSupportMultideviceMethodInfo
ResolveDockBinEdgeMethod "getTemplateChild" o = Gtk.Widget.WidgetGetTemplateChildMethodInfo
ResolveDockBinEdgeMethod "getTitle" o = Dazzle.DockItem.DockItemGetTitleMethodInfo
ResolveDockBinEdgeMethod "getTooltipMarkup" o = Gtk.Widget.WidgetGetTooltipMarkupMethodInfo
ResolveDockBinEdgeMethod "getTooltipText" o = Gtk.Widget.WidgetGetTooltipTextMethodInfo
ResolveDockBinEdgeMethod "getTooltipWindow" o = Gtk.Widget.WidgetGetTooltipWindowMethodInfo
ResolveDockBinEdgeMethod "getToplevel" o = Gtk.Widget.WidgetGetToplevelMethodInfo
ResolveDockBinEdgeMethod "getTransitionDuration" o = Dazzle.DockRevealer.DockRevealerGetTransitionDurationMethodInfo
ResolveDockBinEdgeMethod "getTransitionType" o = Dazzle.DockRevealer.DockRevealerGetTransitionTypeMethodInfo
ResolveDockBinEdgeMethod "getValign" o = Gtk.Widget.WidgetGetValignMethodInfo
ResolveDockBinEdgeMethod "getValignWithBaseline" o = Gtk.Widget.WidgetGetValignWithBaselineMethodInfo
ResolveDockBinEdgeMethod "getVexpand" o = Gtk.Widget.WidgetGetVexpandMethodInfo
ResolveDockBinEdgeMethod "getVexpandSet" o = Gtk.Widget.WidgetGetVexpandSetMethodInfo
ResolveDockBinEdgeMethod "getVisible" o = Gtk.Widget.WidgetGetVisibleMethodInfo
ResolveDockBinEdgeMethod "getVisual" o = Gtk.Widget.WidgetGetVisualMethodInfo
ResolveDockBinEdgeMethod "getWindow" o = Gtk.Widget.WidgetGetWindowMethodInfo
ResolveDockBinEdgeMethod "setAccelPath" o = Gtk.Widget.WidgetSetAccelPathMethodInfo
ResolveDockBinEdgeMethod "setAllocation" o = Gtk.Widget.WidgetSetAllocationMethodInfo
ResolveDockBinEdgeMethod "setAppPaintable" o = Gtk.Widget.WidgetSetAppPaintableMethodInfo
ResolveDockBinEdgeMethod "setBorderWidth" o = Gtk.Container.ContainerSetBorderWidthMethodInfo
ResolveDockBinEdgeMethod "setBuildableProperty" o = Gtk.Buildable.BuildableSetBuildablePropertyMethodInfo
ResolveDockBinEdgeMethod "setCanDefault" o = Gtk.Widget.WidgetSetCanDefaultMethodInfo
ResolveDockBinEdgeMethod "setCanFocus" o = Gtk.Widget.WidgetSetCanFocusMethodInfo
ResolveDockBinEdgeMethod "setChildVisible" o = Gtk.Widget.WidgetSetChildVisibleMethodInfo
ResolveDockBinEdgeMethod "setClip" o = Gtk.Widget.WidgetSetClipMethodInfo
ResolveDockBinEdgeMethod "setCompositeName" o = Gtk.Widget.WidgetSetCompositeNameMethodInfo
ResolveDockBinEdgeMethod "setData" o = GObject.Object.ObjectSetDataMethodInfo
ResolveDockBinEdgeMethod "setDataFull" o = GObject.Object.ObjectSetDataFullMethodInfo
ResolveDockBinEdgeMethod "setDeviceEnabled" o = Gtk.Widget.WidgetSetDeviceEnabledMethodInfo
ResolveDockBinEdgeMethod "setDeviceEvents" o = Gtk.Widget.WidgetSetDeviceEventsMethodInfo
ResolveDockBinEdgeMethod "setDirection" o = Gtk.Widget.WidgetSetDirectionMethodInfo
ResolveDockBinEdgeMethod "setDoubleBuffered" o = Gtk.Widget.WidgetSetDoubleBufferedMethodInfo
ResolveDockBinEdgeMethod "setEvents" o = Gtk.Widget.WidgetSetEventsMethodInfo
ResolveDockBinEdgeMethod "setFocusChain" o = Gtk.Container.ContainerSetFocusChainMethodInfo
ResolveDockBinEdgeMethod "setFocusChild" o = Gtk.Container.ContainerSetFocusChildMethodInfo
ResolveDockBinEdgeMethod "setFocusHadjustment" o = Gtk.Container.ContainerSetFocusHadjustmentMethodInfo
ResolveDockBinEdgeMethod "setFocusOnClick" o = Gtk.Widget.WidgetSetFocusOnClickMethodInfo
ResolveDockBinEdgeMethod "setFocusVadjustment" o = Gtk.Container.ContainerSetFocusVadjustmentMethodInfo
ResolveDockBinEdgeMethod "setFontMap" o = Gtk.Widget.WidgetSetFontMapMethodInfo
ResolveDockBinEdgeMethod "setFontOptions" o = Gtk.Widget.WidgetSetFontOptionsMethodInfo
ResolveDockBinEdgeMethod "setHalign" o = Gtk.Widget.WidgetSetHalignMethodInfo
ResolveDockBinEdgeMethod "setHasTooltip" o = Gtk.Widget.WidgetSetHasTooltipMethodInfo
ResolveDockBinEdgeMethod "setHasWindow" o = Gtk.Widget.WidgetSetHasWindowMethodInfo
ResolveDockBinEdgeMethod "setHexpand" o = Gtk.Widget.WidgetSetHexpandMethodInfo
ResolveDockBinEdgeMethod "setHexpandSet" o = Gtk.Widget.WidgetSetHexpandSetMethodInfo
ResolveDockBinEdgeMethod "setManager" o = Dazzle.DockItem.DockItemSetManagerMethodInfo
ResolveDockBinEdgeMethod "setMapped" o = Gtk.Widget.WidgetSetMappedMethodInfo
ResolveDockBinEdgeMethod "setMarginBottom" o = Gtk.Widget.WidgetSetMarginBottomMethodInfo
ResolveDockBinEdgeMethod "setMarginEnd" o = Gtk.Widget.WidgetSetMarginEndMethodInfo
ResolveDockBinEdgeMethod "setMarginLeft" o = Gtk.Widget.WidgetSetMarginLeftMethodInfo
ResolveDockBinEdgeMethod "setMarginRight" o = Gtk.Widget.WidgetSetMarginRightMethodInfo
ResolveDockBinEdgeMethod "setMarginStart" o = Gtk.Widget.WidgetSetMarginStartMethodInfo
ResolveDockBinEdgeMethod "setMarginTop" o = Gtk.Widget.WidgetSetMarginTopMethodInfo
ResolveDockBinEdgeMethod "setName" o = Gtk.Widget.WidgetSetNameMethodInfo
ResolveDockBinEdgeMethod "setNoShowAll" o = Gtk.Widget.WidgetSetNoShowAllMethodInfo
ResolveDockBinEdgeMethod "setOpacity" o = Gtk.Widget.WidgetSetOpacityMethodInfo
ResolveDockBinEdgeMethod "setParent" o = Gtk.Widget.WidgetSetParentMethodInfo
ResolveDockBinEdgeMethod "setParentWindow" o = Gtk.Widget.WidgetSetParentWindowMethodInfo
ResolveDockBinEdgeMethod "setPosition" o = Dazzle.DockRevealer.DockRevealerSetPositionMethodInfo
ResolveDockBinEdgeMethod "setPositionSet" o = Dazzle.DockRevealer.DockRevealerSetPositionSetMethodInfo
ResolveDockBinEdgeMethod "setProperty" o = GObject.Object.ObjectSetPropertyMethodInfo
ResolveDockBinEdgeMethod "setRealized" o = Gtk.Widget.WidgetSetRealizedMethodInfo
ResolveDockBinEdgeMethod "setReallocateRedraws" o = Gtk.Container.ContainerSetReallocateRedrawsMethodInfo
ResolveDockBinEdgeMethod "setReceivesDefault" o = Gtk.Widget.WidgetSetReceivesDefaultMethodInfo
ResolveDockBinEdgeMethod "setRedrawOnAllocate" o = Gtk.Widget.WidgetSetRedrawOnAllocateMethodInfo
ResolveDockBinEdgeMethod "setResizeMode" o = Gtk.Container.ContainerSetResizeModeMethodInfo
ResolveDockBinEdgeMethod "setRevealChild" o = Dazzle.DockRevealer.DockRevealerSetRevealChildMethodInfo
ResolveDockBinEdgeMethod "setSensitive" o = Gtk.Widget.WidgetSetSensitiveMethodInfo
ResolveDockBinEdgeMethod "setSizeRequest" o = Gtk.Widget.WidgetSetSizeRequestMethodInfo
ResolveDockBinEdgeMethod "setState" o = Gtk.Widget.WidgetSetStateMethodInfo
ResolveDockBinEdgeMethod "setStateFlags" o = Gtk.Widget.WidgetSetStateFlagsMethodInfo
ResolveDockBinEdgeMethod "setStyle" o = Gtk.Widget.WidgetSetStyleMethodInfo
ResolveDockBinEdgeMethod "setSupportMultidevice" o = Gtk.Widget.WidgetSetSupportMultideviceMethodInfo
ResolveDockBinEdgeMethod "setTooltipMarkup" o = Gtk.Widget.WidgetSetTooltipMarkupMethodInfo
ResolveDockBinEdgeMethod "setTooltipText" o = Gtk.Widget.WidgetSetTooltipTextMethodInfo
ResolveDockBinEdgeMethod "setTooltipWindow" o = Gtk.Widget.WidgetSetTooltipWindowMethodInfo
ResolveDockBinEdgeMethod "setTransitionDuration" o = Dazzle.DockRevealer.DockRevealerSetTransitionDurationMethodInfo
ResolveDockBinEdgeMethod "setTransitionType" o = Dazzle.DockRevealer.DockRevealerSetTransitionTypeMethodInfo
ResolveDockBinEdgeMethod "setValign" o = Gtk.Widget.WidgetSetValignMethodInfo
ResolveDockBinEdgeMethod "setVexpand" o = Gtk.Widget.WidgetSetVexpandMethodInfo
ResolveDockBinEdgeMethod "setVexpandSet" o = Gtk.Widget.WidgetSetVexpandSetMethodInfo
ResolveDockBinEdgeMethod "setVisible" o = Gtk.Widget.WidgetSetVisibleMethodInfo
ResolveDockBinEdgeMethod "setVisual" o = Gtk.Widget.WidgetSetVisualMethodInfo
ResolveDockBinEdgeMethod "setWindow" o = Gtk.Widget.WidgetSetWindowMethodInfo
ResolveDockBinEdgeMethod l o = O.MethodResolutionFailed l o
instance (info ~ ResolveDockBinEdgeMethod t DockBinEdge, O.OverloadedMethod info DockBinEdge p) => OL.IsLabel t (DockBinEdge -> 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 ~ ResolveDockBinEdgeMethod t DockBinEdge, O.OverloadedMethod info DockBinEdge p, R.HasField t DockBinEdge p) => R.HasField t DockBinEdge p where
getField = O.overloadedMethod @info
#endif
instance (info ~ ResolveDockBinEdgeMethod t DockBinEdge, O.OverloadedMethodInfo info DockBinEdge) => OL.IsLabel t (O.MethodProxy info DockBinEdge) where
#if MIN_VERSION_base(4,10,0)
fromLabel = O.MethodProxy
#else
fromLabel _ = O.MethodProxy
#endif
#endif
type DockBinEdgeMoveToBinChildCallback =
IO ()
type C_DockBinEdgeMoveToBinChildCallback =
Ptr DockBinEdge ->
Ptr () ->
IO ()
foreign import ccall "wrapper"
mk_DockBinEdgeMoveToBinChildCallback :: C_DockBinEdgeMoveToBinChildCallback -> IO (FunPtr C_DockBinEdgeMoveToBinChildCallback)
wrap_DockBinEdgeMoveToBinChildCallback ::
GObject a => (a -> DockBinEdgeMoveToBinChildCallback) ->
C_DockBinEdgeMoveToBinChildCallback
wrap_DockBinEdgeMoveToBinChildCallback :: forall a.
GObject a =>
(a -> IO ()) -> C_DockBinEdgeMoveToBinChildCallback
wrap_DockBinEdgeMoveToBinChildCallback a -> IO ()
gi'cb Ptr DockBinEdge
gi'selfPtr Ptr ()
_ = do
Ptr DockBinEdge -> (DockBinEdge -> IO ()) -> IO ()
forall o b.
(HasCallStack, GObject o) =>
Ptr o -> (o -> IO b) -> IO b
B.ManagedPtr.withNewObject Ptr DockBinEdge
gi'selfPtr ((DockBinEdge -> IO ()) -> IO ())
-> (DockBinEdge -> IO ()) -> IO ()
forall a b. (a -> b) -> a -> b
$ \DockBinEdge
gi'self -> a -> IO ()
gi'cb (DockBinEdge -> a
forall a b. Coercible a b => a -> b
Coerce.coerce DockBinEdge
gi'self)
onDockBinEdgeMoveToBinChild :: (IsDockBinEdge a, MonadIO m) => a -> ((?self :: a) => DockBinEdgeMoveToBinChildCallback) -> m SignalHandlerId
onDockBinEdgeMoveToBinChild :: forall a (m :: * -> *).
(IsDockBinEdge a, MonadIO m) =>
a -> ((?self::a) => IO ()) -> m SignalHandlerId
onDockBinEdgeMoveToBinChild a
obj (?self::a) => IO ()
cb = IO SignalHandlerId -> m SignalHandlerId
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO SignalHandlerId -> m SignalHandlerId)
-> IO SignalHandlerId -> m SignalHandlerId
forall a b. (a -> b) -> a -> b
$ do
let wrapped :: a -> IO ()
wrapped a
self = let ?self = a
?self::a
self in IO ()
(?self::a) => IO ()
cb
let wrapped' :: C_DockBinEdgeMoveToBinChildCallback
wrapped' = (a -> IO ()) -> C_DockBinEdgeMoveToBinChildCallback
forall a.
GObject a =>
(a -> IO ()) -> C_DockBinEdgeMoveToBinChildCallback
wrap_DockBinEdgeMoveToBinChildCallback a -> IO ()
wrapped
FunPtr C_DockBinEdgeMoveToBinChildCallback
wrapped'' <- C_DockBinEdgeMoveToBinChildCallback
-> IO (FunPtr C_DockBinEdgeMoveToBinChildCallback)
mk_DockBinEdgeMoveToBinChildCallback C_DockBinEdgeMoveToBinChildCallback
wrapped'
a
-> Text
-> FunPtr C_DockBinEdgeMoveToBinChildCallback
-> SignalConnectMode
-> Maybe Text
-> IO SignalHandlerId
forall o a.
GObject o =>
o
-> Text
-> FunPtr a
-> SignalConnectMode
-> Maybe Text
-> IO SignalHandlerId
connectSignalFunPtr a
obj Text
"move-to-bin-child" FunPtr C_DockBinEdgeMoveToBinChildCallback
wrapped'' SignalConnectMode
SignalConnectBefore Maybe Text
forall a. Maybe a
Nothing
afterDockBinEdgeMoveToBinChild :: (IsDockBinEdge a, MonadIO m) => a -> ((?self :: a) => DockBinEdgeMoveToBinChildCallback) -> m SignalHandlerId
afterDockBinEdgeMoveToBinChild :: forall a (m :: * -> *).
(IsDockBinEdge a, MonadIO m) =>
a -> ((?self::a) => IO ()) -> m SignalHandlerId
afterDockBinEdgeMoveToBinChild a
obj (?self::a) => IO ()
cb = IO SignalHandlerId -> m SignalHandlerId
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO SignalHandlerId -> m SignalHandlerId)
-> IO SignalHandlerId -> m SignalHandlerId
forall a b. (a -> b) -> a -> b
$ do
let wrapped :: a -> IO ()
wrapped a
self = let ?self = a
?self::a
self in IO ()
(?self::a) => IO ()
cb
let wrapped' :: C_DockBinEdgeMoveToBinChildCallback
wrapped' = (a -> IO ()) -> C_DockBinEdgeMoveToBinChildCallback
forall a.
GObject a =>
(a -> IO ()) -> C_DockBinEdgeMoveToBinChildCallback
wrap_DockBinEdgeMoveToBinChildCallback a -> IO ()
wrapped
FunPtr C_DockBinEdgeMoveToBinChildCallback
wrapped'' <- C_DockBinEdgeMoveToBinChildCallback
-> IO (FunPtr C_DockBinEdgeMoveToBinChildCallback)
mk_DockBinEdgeMoveToBinChildCallback C_DockBinEdgeMoveToBinChildCallback
wrapped'
a
-> Text
-> FunPtr C_DockBinEdgeMoveToBinChildCallback
-> SignalConnectMode
-> Maybe Text
-> IO SignalHandlerId
forall o a.
GObject o =>
o
-> Text
-> FunPtr a
-> SignalConnectMode
-> Maybe Text
-> IO SignalHandlerId
connectSignalFunPtr a
obj Text
"move-to-bin-child" FunPtr C_DockBinEdgeMoveToBinChildCallback
wrapped'' SignalConnectMode
SignalConnectAfter Maybe Text
forall a. Maybe a
Nothing
#if defined(ENABLE_OVERLOADING)
data DockBinEdgeMoveToBinChildSignalInfo
instance SignalInfo DockBinEdgeMoveToBinChildSignalInfo where
type HaskellCallbackType DockBinEdgeMoveToBinChildSignalInfo = DockBinEdgeMoveToBinChildCallback
connectSignal obj cb connectMode detail = do
let cb' = wrap_DockBinEdgeMoveToBinChildCallback cb
cb'' <- mk_DockBinEdgeMoveToBinChildCallback cb'
connectSignalFunPtr obj "move-to-bin-child" cb'' connectMode detail
dbgSignalInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.DockBinEdge::move-to-bin-child"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-DockBinEdge.html#g:signal:moveToBinChild"})
#endif
getDockBinEdgeEdge :: (MonadIO m, IsDockBinEdge o) => o -> m Gtk.Enums.PositionType
getDockBinEdgeEdge :: forall (m :: * -> *) o.
(MonadIO m, IsDockBinEdge o) =>
o -> m PositionType
getDockBinEdgeEdge 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"
setDockBinEdgeEdge :: (MonadIO m, IsDockBinEdge o) => o -> Gtk.Enums.PositionType -> m ()
setDockBinEdgeEdge :: forall (m :: * -> *) o.
(MonadIO m, IsDockBinEdge o) =>
o -> PositionType -> m ()
setDockBinEdgeEdge 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
constructDockBinEdgeEdge :: (IsDockBinEdge o, MIO.MonadIO m) => Gtk.Enums.PositionType -> m (GValueConstruct o)
constructDockBinEdgeEdge :: forall o (m :: * -> *).
(IsDockBinEdge o, MonadIO m) =>
PositionType -> m (GValueConstruct o)
constructDockBinEdgeEdge 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 DockBinEdgeEdgePropertyInfo
instance AttrInfo DockBinEdgeEdgePropertyInfo where
type AttrAllowedOps DockBinEdgeEdgePropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
type AttrBaseTypeConstraint DockBinEdgeEdgePropertyInfo = IsDockBinEdge
type AttrSetTypeConstraint DockBinEdgeEdgePropertyInfo = (~) Gtk.Enums.PositionType
type AttrTransferTypeConstraint DockBinEdgeEdgePropertyInfo = (~) Gtk.Enums.PositionType
type AttrTransferType DockBinEdgeEdgePropertyInfo = Gtk.Enums.PositionType
type AttrGetType DockBinEdgeEdgePropertyInfo = Gtk.Enums.PositionType
type AttrLabel DockBinEdgeEdgePropertyInfo = "edge"
type AttrOrigin DockBinEdgeEdgePropertyInfo = DockBinEdge
attrGet = getDockBinEdgeEdge
attrSet = setDockBinEdgeEdge
attrTransfer _ v = do
return v
attrConstruct = constructDockBinEdgeEdge
attrClear = undefined
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.DockBinEdge.edge"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-DockBinEdge.html#g:attr:edge"
})
#endif
#if defined(ENABLE_OVERLOADING)
instance O.HasAttributeList DockBinEdge
type instance O.AttributeList DockBinEdge = DockBinEdgeAttributeList
type DockBinEdgeAttributeList = ('[ '("appPaintable", Gtk.Widget.WidgetAppPaintablePropertyInfo), '("borderWidth", Gtk.Container.ContainerBorderWidthPropertyInfo), '("canDefault", Gtk.Widget.WidgetCanDefaultPropertyInfo), '("canFocus", Gtk.Widget.WidgetCanFocusPropertyInfo), '("child", Gtk.Container.ContainerChildPropertyInfo), '("childRevealed", Dazzle.DockRevealer.DockRevealerChildRevealedPropertyInfo), '("compositeChild", Gtk.Widget.WidgetCompositeChildPropertyInfo), '("doubleBuffered", Gtk.Widget.WidgetDoubleBufferedPropertyInfo), '("edge", DockBinEdgeEdgePropertyInfo), '("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), '("name", Gtk.Widget.WidgetNamePropertyInfo), '("noShowAll", Gtk.Widget.WidgetNoShowAllPropertyInfo), '("opacity", Gtk.Widget.WidgetOpacityPropertyInfo), '("parent", Gtk.Widget.WidgetParentPropertyInfo), '("position", Dazzle.DockRevealer.DockRevealerPositionPropertyInfo), '("positionSet", Dazzle.DockRevealer.DockRevealerPositionSetPropertyInfo), '("receivesDefault", Gtk.Widget.WidgetReceivesDefaultPropertyInfo), '("resizeMode", Gtk.Container.ContainerResizeModePropertyInfo), '("revealChild", Dazzle.DockRevealer.DockRevealerRevealChildPropertyInfo), '("scaleFactor", Gtk.Widget.WidgetScaleFactorPropertyInfo), '("sensitive", Gtk.Widget.WidgetSensitivePropertyInfo), '("style", Gtk.Widget.WidgetStylePropertyInfo), '("tooltipMarkup", Gtk.Widget.WidgetTooltipMarkupPropertyInfo), '("tooltipText", Gtk.Widget.WidgetTooltipTextPropertyInfo), '("transitionDuration", Dazzle.DockRevealer.DockRevealerTransitionDurationPropertyInfo), '("transitionType", Dazzle.DockRevealer.DockRevealerTransitionTypePropertyInfo), '("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)
dockBinEdgeEdge :: AttrLabelProxy "edge"
dockBinEdgeEdge = AttrLabelProxy
#endif
#if defined(ENABLE_OVERLOADING)
type instance O.SignalList DockBinEdge = DockBinEdgeSignalList
type DockBinEdgeSignalList = ('[ '("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), '("moveToBinChild", DockBinEdgeMoveToBinChildSignalInfo), '("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_bin_edge_get_edge" dzl_dock_bin_edge_get_edge ::
Ptr DockBinEdge ->
IO CUInt
dockBinEdgeGetEdge ::
(B.CallStack.HasCallStack, MonadIO m, IsDockBinEdge a) =>
a
-> m Gtk.Enums.PositionType
dockBinEdgeGetEdge :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsDockBinEdge a) =>
a -> m PositionType
dockBinEdgeGetEdge 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 DockBinEdge
self' <- a -> IO (Ptr DockBinEdge)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
CUInt
result <- Ptr DockBinEdge -> IO CUInt
dzl_dock_bin_edge_get_edge Ptr DockBinEdge
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 DockBinEdgeGetEdgeMethodInfo
instance (signature ~ (m Gtk.Enums.PositionType), MonadIO m, IsDockBinEdge a) => O.OverloadedMethod DockBinEdgeGetEdgeMethodInfo a signature where
overloadedMethod = dockBinEdgeGetEdge
instance O.OverloadedMethodInfo DockBinEdgeGetEdgeMethodInfo a where
overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.DockBinEdge.dockBinEdgeGetEdge",
O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-DockBinEdge.html#v:dockBinEdgeGetEdge"
})
#endif