{-# LANGUAGE TypeApplications #-}
#if (MIN_VERSION_haskell_gi_overloading(1,0,0) && !defined(__HADDOCK_VERSION__))
#define ENABLE_OVERLOADING
#endif
module GI.Dazzle.Objects.ShortcutSimpleLabel
(
ShortcutSimpleLabel(..) ,
IsShortcutSimpleLabel ,
toShortcutSimpleLabel ,
#if defined(ENABLE_OVERLOADING)
ResolveShortcutSimpleLabelMethod ,
#endif
#if defined(ENABLE_OVERLOADING)
ShortcutSimpleLabelGetAccelMethodInfo ,
#endif
shortcutSimpleLabelGetAccel ,
#if defined(ENABLE_OVERLOADING)
ShortcutSimpleLabelGetActionMethodInfo ,
#endif
shortcutSimpleLabelGetAction ,
#if defined(ENABLE_OVERLOADING)
ShortcutSimpleLabelGetCommandMethodInfo ,
#endif
shortcutSimpleLabelGetCommand ,
#if defined(ENABLE_OVERLOADING)
ShortcutSimpleLabelGetTitleMethodInfo ,
#endif
shortcutSimpleLabelGetTitle ,
shortcutSimpleLabelNew ,
#if defined(ENABLE_OVERLOADING)
ShortcutSimpleLabelSetAccelMethodInfo ,
#endif
shortcutSimpleLabelSetAccel ,
#if defined(ENABLE_OVERLOADING)
ShortcutSimpleLabelSetActionMethodInfo ,
#endif
shortcutSimpleLabelSetAction ,
#if defined(ENABLE_OVERLOADING)
ShortcutSimpleLabelSetCommandMethodInfo ,
#endif
shortcutSimpleLabelSetCommand ,
#if defined(ENABLE_OVERLOADING)
ShortcutSimpleLabelSetTitleMethodInfo ,
#endif
shortcutSimpleLabelSetTitle ,
#if defined(ENABLE_OVERLOADING)
ShortcutSimpleLabelAccelPropertyInfo ,
#endif
constructShortcutSimpleLabelAccel ,
getShortcutSimpleLabelAccel ,
setShortcutSimpleLabelAccel ,
#if defined(ENABLE_OVERLOADING)
shortcutSimpleLabelAccel ,
#endif
#if defined(ENABLE_OVERLOADING)
ShortcutSimpleLabelActionPropertyInfo ,
#endif
constructShortcutSimpleLabelAction ,
getShortcutSimpleLabelAction ,
setShortcutSimpleLabelAction ,
#if defined(ENABLE_OVERLOADING)
shortcutSimpleLabelAction ,
#endif
#if defined(ENABLE_OVERLOADING)
ShortcutSimpleLabelCommandPropertyInfo ,
#endif
constructShortcutSimpleLabelCommand ,
getShortcutSimpleLabelCommand ,
setShortcutSimpleLabelCommand ,
#if defined(ENABLE_OVERLOADING)
shortcutSimpleLabelCommand ,
#endif
#if defined(ENABLE_OVERLOADING)
ShortcutSimpleLabelShowAccelPropertyInfo,
#endif
constructShortcutSimpleLabelShowAccel ,
getShortcutSimpleLabelShowAccel ,
setShortcutSimpleLabelShowAccel ,
#if defined(ENABLE_OVERLOADING)
shortcutSimpleLabelShowAccel ,
#endif
#if defined(ENABLE_OVERLOADING)
ShortcutSimpleLabelTitlePropertyInfo ,
#endif
constructShortcutSimpleLabelTitle ,
getShortcutSimpleLabelTitle ,
setShortcutSimpleLabelTitle ,
#if defined(ENABLE_OVERLOADING)
shortcutSimpleLabelTitle ,
#endif
) 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 qualified GI.GObject.Objects.Object as GObject.Object
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 qualified GI.GObject.Objects.Object as GObject.Object
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 ShortcutSimpleLabel = ShortcutSimpleLabel (SP.ManagedPtr ShortcutSimpleLabel)
deriving (ShortcutSimpleLabel -> ShortcutSimpleLabel -> Bool
(ShortcutSimpleLabel -> ShortcutSimpleLabel -> Bool)
-> (ShortcutSimpleLabel -> ShortcutSimpleLabel -> Bool)
-> Eq ShortcutSimpleLabel
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: ShortcutSimpleLabel -> ShortcutSimpleLabel -> Bool
== :: ShortcutSimpleLabel -> ShortcutSimpleLabel -> Bool
$c/= :: ShortcutSimpleLabel -> ShortcutSimpleLabel -> Bool
/= :: ShortcutSimpleLabel -> ShortcutSimpleLabel -> Bool
Eq)
instance SP.ManagedPtrNewtype ShortcutSimpleLabel where
toManagedPtr :: ShortcutSimpleLabel -> ManagedPtr ShortcutSimpleLabel
toManagedPtr (ShortcutSimpleLabel ManagedPtr ShortcutSimpleLabel
p) = ManagedPtr ShortcutSimpleLabel
p
foreign import ccall "dzl_shortcut_simple_label_get_type"
c_dzl_shortcut_simple_label_get_type :: IO B.Types.GType
instance B.Types.TypedObject ShortcutSimpleLabel where
glibType :: IO GType
glibType = IO GType
c_dzl_shortcut_simple_label_get_type
instance B.Types.GObject ShortcutSimpleLabel
class (SP.GObject o, O.IsDescendantOf ShortcutSimpleLabel o) => IsShortcutSimpleLabel o
instance (SP.GObject o, O.IsDescendantOf ShortcutSimpleLabel o) => IsShortcutSimpleLabel o
instance O.HasParentTypes ShortcutSimpleLabel
type instance O.ParentTypes ShortcutSimpleLabel = '[Gtk.Box.Box, Gtk.Container.Container, Gtk.Widget.Widget, GObject.Object.Object, Atk.ImplementorIface.ImplementorIface, Gtk.Buildable.Buildable, Gtk.Orientable.Orientable]
toShortcutSimpleLabel :: (MIO.MonadIO m, IsShortcutSimpleLabel o) => o -> m ShortcutSimpleLabel
toShortcutSimpleLabel :: forall (m :: * -> *) o.
(MonadIO m, IsShortcutSimpleLabel o) =>
o -> m ShortcutSimpleLabel
toShortcutSimpleLabel = IO ShortcutSimpleLabel -> m ShortcutSimpleLabel
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO ShortcutSimpleLabel -> m ShortcutSimpleLabel)
-> (o -> IO ShortcutSimpleLabel) -> o -> m ShortcutSimpleLabel
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (ManagedPtr ShortcutSimpleLabel -> ShortcutSimpleLabel)
-> o -> IO ShortcutSimpleLabel
forall o o'.
(HasCallStack, ManagedPtrNewtype o, TypedObject o,
ManagedPtrNewtype o', TypedObject o') =>
(ManagedPtr o' -> o') -> o -> IO o'
B.ManagedPtr.unsafeCastTo ManagedPtr ShortcutSimpleLabel -> ShortcutSimpleLabel
ShortcutSimpleLabel
instance B.GValue.IsGValue (Maybe ShortcutSimpleLabel) where
gvalueGType_ :: IO GType
gvalueGType_ = IO GType
c_dzl_shortcut_simple_label_get_type
gvalueSet_ :: Ptr GValue -> Maybe ShortcutSimpleLabel -> IO ()
gvalueSet_ Ptr GValue
gv Maybe ShortcutSimpleLabel
P.Nothing = Ptr GValue -> Ptr ShortcutSimpleLabel -> IO ()
forall a. GObject a => Ptr GValue -> Ptr a -> IO ()
B.GValue.set_object Ptr GValue
gv (Ptr ShortcutSimpleLabel
forall a. Ptr a
FP.nullPtr :: FP.Ptr ShortcutSimpleLabel)
gvalueSet_ Ptr GValue
gv (P.Just ShortcutSimpleLabel
obj) = ShortcutSimpleLabel -> (Ptr ShortcutSimpleLabel -> IO ()) -> IO ()
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
B.ManagedPtr.withManagedPtr ShortcutSimpleLabel
obj (Ptr GValue -> Ptr ShortcutSimpleLabel -> IO ()
forall a. GObject a => Ptr GValue -> Ptr a -> IO ()
B.GValue.set_object Ptr GValue
gv)
gvalueGet_ :: Ptr GValue -> IO (Maybe ShortcutSimpleLabel)
gvalueGet_ Ptr GValue
gv = do
Ptr ShortcutSimpleLabel
ptr <- Ptr GValue -> IO (Ptr ShortcutSimpleLabel)
forall a. GObject a => Ptr GValue -> IO (Ptr a)
B.GValue.get_object Ptr GValue
gv :: IO (FP.Ptr ShortcutSimpleLabel)
if Ptr ShortcutSimpleLabel
ptr Ptr ShortcutSimpleLabel -> Ptr ShortcutSimpleLabel -> Bool
forall a. Eq a => a -> a -> Bool
/= Ptr ShortcutSimpleLabel
forall a. Ptr a
FP.nullPtr
then ShortcutSimpleLabel -> Maybe ShortcutSimpleLabel
forall a. a -> Maybe a
P.Just (ShortcutSimpleLabel -> Maybe ShortcutSimpleLabel)
-> IO ShortcutSimpleLabel -> IO (Maybe ShortcutSimpleLabel)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (ManagedPtr ShortcutSimpleLabel -> ShortcutSimpleLabel)
-> Ptr ShortcutSimpleLabel -> IO ShortcutSimpleLabel
forall a b.
(HasCallStack, GObject a, GObject b) =>
(ManagedPtr a -> a) -> Ptr b -> IO a
B.ManagedPtr.newObject ManagedPtr ShortcutSimpleLabel -> ShortcutSimpleLabel
ShortcutSimpleLabel Ptr ShortcutSimpleLabel
ptr
else Maybe ShortcutSimpleLabel -> IO (Maybe ShortcutSimpleLabel)
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return Maybe ShortcutSimpleLabel
forall a. Maybe a
P.Nothing
#if defined(ENABLE_OVERLOADING)
type family ResolveShortcutSimpleLabelMethod (t :: Symbol) (o :: DK.Type) :: DK.Type where
ResolveShortcutSimpleLabelMethod "activate" o = Gtk.Widget.WidgetActivateMethodInfo
ResolveShortcutSimpleLabelMethod "add" o = Gtk.Container.ContainerAddMethodInfo
ResolveShortcutSimpleLabelMethod "addAccelerator" o = Gtk.Widget.WidgetAddAcceleratorMethodInfo
ResolveShortcutSimpleLabelMethod "addChild" o = Gtk.Buildable.BuildableAddChildMethodInfo
ResolveShortcutSimpleLabelMethod "addDeviceEvents" o = Gtk.Widget.WidgetAddDeviceEventsMethodInfo
ResolveShortcutSimpleLabelMethod "addEvents" o = Gtk.Widget.WidgetAddEventsMethodInfo
ResolveShortcutSimpleLabelMethod "addMnemonicLabel" o = Gtk.Widget.WidgetAddMnemonicLabelMethodInfo
ResolveShortcutSimpleLabelMethod "addTickCallback" o = Gtk.Widget.WidgetAddTickCallbackMethodInfo
ResolveShortcutSimpleLabelMethod "bindProperty" o = GObject.Object.ObjectBindPropertyMethodInfo
ResolveShortcutSimpleLabelMethod "bindPropertyFull" o = GObject.Object.ObjectBindPropertyFullMethodInfo
ResolveShortcutSimpleLabelMethod "canActivateAccel" o = Gtk.Widget.WidgetCanActivateAccelMethodInfo
ResolveShortcutSimpleLabelMethod "checkResize" o = Gtk.Container.ContainerCheckResizeMethodInfo
ResolveShortcutSimpleLabelMethod "childFocus" o = Gtk.Widget.WidgetChildFocusMethodInfo
ResolveShortcutSimpleLabelMethod "childGetProperty" o = Gtk.Container.ContainerChildGetPropertyMethodInfo
ResolveShortcutSimpleLabelMethod "childNotify" o = Gtk.Container.ContainerChildNotifyMethodInfo
ResolveShortcutSimpleLabelMethod "childNotifyByPspec" o = Gtk.Container.ContainerChildNotifyByPspecMethodInfo
ResolveShortcutSimpleLabelMethod "childSetProperty" o = Gtk.Container.ContainerChildSetPropertyMethodInfo
ResolveShortcutSimpleLabelMethod "childType" o = Gtk.Container.ContainerChildTypeMethodInfo
ResolveShortcutSimpleLabelMethod "classPath" o = Gtk.Widget.WidgetClassPathMethodInfo
ResolveShortcutSimpleLabelMethod "computeExpand" o = Gtk.Widget.WidgetComputeExpandMethodInfo
ResolveShortcutSimpleLabelMethod "constructChild" o = Gtk.Buildable.BuildableConstructChildMethodInfo
ResolveShortcutSimpleLabelMethod "createPangoContext" o = Gtk.Widget.WidgetCreatePangoContextMethodInfo
ResolveShortcutSimpleLabelMethod "createPangoLayout" o = Gtk.Widget.WidgetCreatePangoLayoutMethodInfo
ResolveShortcutSimpleLabelMethod "customFinished" o = Gtk.Buildable.BuildableCustomFinishedMethodInfo
ResolveShortcutSimpleLabelMethod "customTagEnd" o = Gtk.Buildable.BuildableCustomTagEndMethodInfo
ResolveShortcutSimpleLabelMethod "customTagStart" o = Gtk.Buildable.BuildableCustomTagStartMethodInfo
ResolveShortcutSimpleLabelMethod "destroy" o = Gtk.Widget.WidgetDestroyMethodInfo
ResolveShortcutSimpleLabelMethod "destroyed" o = Gtk.Widget.WidgetDestroyedMethodInfo
ResolveShortcutSimpleLabelMethod "deviceIsShadowed" o = Gtk.Widget.WidgetDeviceIsShadowedMethodInfo
ResolveShortcutSimpleLabelMethod "dragBegin" o = Gtk.Widget.WidgetDragBeginMethodInfo
ResolveShortcutSimpleLabelMethod "dragBeginWithCoordinates" o = Gtk.Widget.WidgetDragBeginWithCoordinatesMethodInfo
ResolveShortcutSimpleLabelMethod "dragCheckThreshold" o = Gtk.Widget.WidgetDragCheckThresholdMethodInfo
ResolveShortcutSimpleLabelMethod "dragDestAddImageTargets" o = Gtk.Widget.WidgetDragDestAddImageTargetsMethodInfo
ResolveShortcutSimpleLabelMethod "dragDestAddTextTargets" o = Gtk.Widget.WidgetDragDestAddTextTargetsMethodInfo
ResolveShortcutSimpleLabelMethod "dragDestAddUriTargets" o = Gtk.Widget.WidgetDragDestAddUriTargetsMethodInfo
ResolveShortcutSimpleLabelMethod "dragDestFindTarget" o = Gtk.Widget.WidgetDragDestFindTargetMethodInfo
ResolveShortcutSimpleLabelMethod "dragDestGetTargetList" o = Gtk.Widget.WidgetDragDestGetTargetListMethodInfo
ResolveShortcutSimpleLabelMethod "dragDestGetTrackMotion" o = Gtk.Widget.WidgetDragDestGetTrackMotionMethodInfo
ResolveShortcutSimpleLabelMethod "dragDestSet" o = Gtk.Widget.WidgetDragDestSetMethodInfo
ResolveShortcutSimpleLabelMethod "dragDestSetProxy" o = Gtk.Widget.WidgetDragDestSetProxyMethodInfo
ResolveShortcutSimpleLabelMethod "dragDestSetTargetList" o = Gtk.Widget.WidgetDragDestSetTargetListMethodInfo
ResolveShortcutSimpleLabelMethod "dragDestSetTrackMotion" o = Gtk.Widget.WidgetDragDestSetTrackMotionMethodInfo
ResolveShortcutSimpleLabelMethod "dragDestUnset" o = Gtk.Widget.WidgetDragDestUnsetMethodInfo
ResolveShortcutSimpleLabelMethod "dragGetData" o = Gtk.Widget.WidgetDragGetDataMethodInfo
ResolveShortcutSimpleLabelMethod "dragHighlight" o = Gtk.Widget.WidgetDragHighlightMethodInfo
ResolveShortcutSimpleLabelMethod "dragSourceAddImageTargets" o = Gtk.Widget.WidgetDragSourceAddImageTargetsMethodInfo
ResolveShortcutSimpleLabelMethod "dragSourceAddTextTargets" o = Gtk.Widget.WidgetDragSourceAddTextTargetsMethodInfo
ResolveShortcutSimpleLabelMethod "dragSourceAddUriTargets" o = Gtk.Widget.WidgetDragSourceAddUriTargetsMethodInfo
ResolveShortcutSimpleLabelMethod "dragSourceGetTargetList" o = Gtk.Widget.WidgetDragSourceGetTargetListMethodInfo
ResolveShortcutSimpleLabelMethod "dragSourceSet" o = Gtk.Widget.WidgetDragSourceSetMethodInfo
ResolveShortcutSimpleLabelMethod "dragSourceSetIconGicon" o = Gtk.Widget.WidgetDragSourceSetIconGiconMethodInfo
ResolveShortcutSimpleLabelMethod "dragSourceSetIconName" o = Gtk.Widget.WidgetDragSourceSetIconNameMethodInfo
ResolveShortcutSimpleLabelMethod "dragSourceSetIconPixbuf" o = Gtk.Widget.WidgetDragSourceSetIconPixbufMethodInfo
ResolveShortcutSimpleLabelMethod "dragSourceSetIconStock" o = Gtk.Widget.WidgetDragSourceSetIconStockMethodInfo
ResolveShortcutSimpleLabelMethod "dragSourceSetTargetList" o = Gtk.Widget.WidgetDragSourceSetTargetListMethodInfo
ResolveShortcutSimpleLabelMethod "dragSourceUnset" o = Gtk.Widget.WidgetDragSourceUnsetMethodInfo
ResolveShortcutSimpleLabelMethod "dragUnhighlight" o = Gtk.Widget.WidgetDragUnhighlightMethodInfo
ResolveShortcutSimpleLabelMethod "draw" o = Gtk.Widget.WidgetDrawMethodInfo
ResolveShortcutSimpleLabelMethod "ensureStyle" o = Gtk.Widget.WidgetEnsureStyleMethodInfo
ResolveShortcutSimpleLabelMethod "errorBell" o = Gtk.Widget.WidgetErrorBellMethodInfo
ResolveShortcutSimpleLabelMethod "event" o = Gtk.Widget.WidgetEventMethodInfo
ResolveShortcutSimpleLabelMethod "forall" o = Gtk.Container.ContainerForallMethodInfo
ResolveShortcutSimpleLabelMethod "forceFloating" o = GObject.Object.ObjectForceFloatingMethodInfo
ResolveShortcutSimpleLabelMethod "foreach" o = Gtk.Container.ContainerForeachMethodInfo
ResolveShortcutSimpleLabelMethod "freezeChildNotify" o = Gtk.Widget.WidgetFreezeChildNotifyMethodInfo
ResolveShortcutSimpleLabelMethod "freezeNotify" o = GObject.Object.ObjectFreezeNotifyMethodInfo
ResolveShortcutSimpleLabelMethod "getv" o = GObject.Object.ObjectGetvMethodInfo
ResolveShortcutSimpleLabelMethod "grabAdd" o = Gtk.Widget.WidgetGrabAddMethodInfo
ResolveShortcutSimpleLabelMethod "grabDefault" o = Gtk.Widget.WidgetGrabDefaultMethodInfo
ResolveShortcutSimpleLabelMethod "grabFocus" o = Gtk.Widget.WidgetGrabFocusMethodInfo
ResolveShortcutSimpleLabelMethod "grabRemove" o = Gtk.Widget.WidgetGrabRemoveMethodInfo
ResolveShortcutSimpleLabelMethod "hasDefault" o = Gtk.Widget.WidgetHasDefaultMethodInfo
ResolveShortcutSimpleLabelMethod "hasFocus" o = Gtk.Widget.WidgetHasFocusMethodInfo
ResolveShortcutSimpleLabelMethod "hasGrab" o = Gtk.Widget.WidgetHasGrabMethodInfo
ResolveShortcutSimpleLabelMethod "hasRcStyle" o = Gtk.Widget.WidgetHasRcStyleMethodInfo
ResolveShortcutSimpleLabelMethod "hasScreen" o = Gtk.Widget.WidgetHasScreenMethodInfo
ResolveShortcutSimpleLabelMethod "hasVisibleFocus" o = Gtk.Widget.WidgetHasVisibleFocusMethodInfo
ResolveShortcutSimpleLabelMethod "hide" o = Gtk.Widget.WidgetHideMethodInfo
ResolveShortcutSimpleLabelMethod "hideOnDelete" o = Gtk.Widget.WidgetHideOnDeleteMethodInfo
ResolveShortcutSimpleLabelMethod "inDestruction" o = Gtk.Widget.WidgetInDestructionMethodInfo
ResolveShortcutSimpleLabelMethod "initTemplate" o = Gtk.Widget.WidgetInitTemplateMethodInfo
ResolveShortcutSimpleLabelMethod "inputShapeCombineRegion" o = Gtk.Widget.WidgetInputShapeCombineRegionMethodInfo
ResolveShortcutSimpleLabelMethod "insertActionGroup" o = Gtk.Widget.WidgetInsertActionGroupMethodInfo
ResolveShortcutSimpleLabelMethod "intersect" o = Gtk.Widget.WidgetIntersectMethodInfo
ResolveShortcutSimpleLabelMethod "isAncestor" o = Gtk.Widget.WidgetIsAncestorMethodInfo
ResolveShortcutSimpleLabelMethod "isComposited" o = Gtk.Widget.WidgetIsCompositedMethodInfo
ResolveShortcutSimpleLabelMethod "isDrawable" o = Gtk.Widget.WidgetIsDrawableMethodInfo
ResolveShortcutSimpleLabelMethod "isFloating" o = GObject.Object.ObjectIsFloatingMethodInfo
ResolveShortcutSimpleLabelMethod "isFocus" o = Gtk.Widget.WidgetIsFocusMethodInfo
ResolveShortcutSimpleLabelMethod "isSensitive" o = Gtk.Widget.WidgetIsSensitiveMethodInfo
ResolveShortcutSimpleLabelMethod "isToplevel" o = Gtk.Widget.WidgetIsToplevelMethodInfo
ResolveShortcutSimpleLabelMethod "isVisible" o = Gtk.Widget.WidgetIsVisibleMethodInfo
ResolveShortcutSimpleLabelMethod "keynavFailed" o = Gtk.Widget.WidgetKeynavFailedMethodInfo
ResolveShortcutSimpleLabelMethod "listAccelClosures" o = Gtk.Widget.WidgetListAccelClosuresMethodInfo
ResolveShortcutSimpleLabelMethod "listActionPrefixes" o = Gtk.Widget.WidgetListActionPrefixesMethodInfo
ResolveShortcutSimpleLabelMethod "listMnemonicLabels" o = Gtk.Widget.WidgetListMnemonicLabelsMethodInfo
ResolveShortcutSimpleLabelMethod "map" o = Gtk.Widget.WidgetMapMethodInfo
ResolveShortcutSimpleLabelMethod "mnemonicActivate" o = Gtk.Widget.WidgetMnemonicActivateMethodInfo
ResolveShortcutSimpleLabelMethod "modifyBase" o = Gtk.Widget.WidgetModifyBaseMethodInfo
ResolveShortcutSimpleLabelMethod "modifyBg" o = Gtk.Widget.WidgetModifyBgMethodInfo
ResolveShortcutSimpleLabelMethod "modifyCursor" o = Gtk.Widget.WidgetModifyCursorMethodInfo
ResolveShortcutSimpleLabelMethod "modifyFg" o = Gtk.Widget.WidgetModifyFgMethodInfo
ResolveShortcutSimpleLabelMethod "modifyFont" o = Gtk.Widget.WidgetModifyFontMethodInfo
ResolveShortcutSimpleLabelMethod "modifyStyle" o = Gtk.Widget.WidgetModifyStyleMethodInfo
ResolveShortcutSimpleLabelMethod "modifyText" o = Gtk.Widget.WidgetModifyTextMethodInfo
ResolveShortcutSimpleLabelMethod "notify" o = GObject.Object.ObjectNotifyMethodInfo
ResolveShortcutSimpleLabelMethod "notifyByPspec" o = GObject.Object.ObjectNotifyByPspecMethodInfo
ResolveShortcutSimpleLabelMethod "overrideBackgroundColor" o = Gtk.Widget.WidgetOverrideBackgroundColorMethodInfo
ResolveShortcutSimpleLabelMethod "overrideColor" o = Gtk.Widget.WidgetOverrideColorMethodInfo
ResolveShortcutSimpleLabelMethod "overrideCursor" o = Gtk.Widget.WidgetOverrideCursorMethodInfo
ResolveShortcutSimpleLabelMethod "overrideFont" o = Gtk.Widget.WidgetOverrideFontMethodInfo
ResolveShortcutSimpleLabelMethod "overrideSymbolicColor" o = Gtk.Widget.WidgetOverrideSymbolicColorMethodInfo
ResolveShortcutSimpleLabelMethod "packEnd" o = Gtk.Box.BoxPackEndMethodInfo
ResolveShortcutSimpleLabelMethod "packStart" o = Gtk.Box.BoxPackStartMethodInfo
ResolveShortcutSimpleLabelMethod "parserFinished" o = Gtk.Buildable.BuildableParserFinishedMethodInfo
ResolveShortcutSimpleLabelMethod "path" o = Gtk.Widget.WidgetPathMethodInfo
ResolveShortcutSimpleLabelMethod "propagateDraw" o = Gtk.Container.ContainerPropagateDrawMethodInfo
ResolveShortcutSimpleLabelMethod "queryChildPacking" o = Gtk.Box.BoxQueryChildPackingMethodInfo
ResolveShortcutSimpleLabelMethod "queueAllocate" o = Gtk.Widget.WidgetQueueAllocateMethodInfo
ResolveShortcutSimpleLabelMethod "queueComputeExpand" o = Gtk.Widget.WidgetQueueComputeExpandMethodInfo
ResolveShortcutSimpleLabelMethod "queueDraw" o = Gtk.Widget.WidgetQueueDrawMethodInfo
ResolveShortcutSimpleLabelMethod "queueDrawArea" o = Gtk.Widget.WidgetQueueDrawAreaMethodInfo
ResolveShortcutSimpleLabelMethod "queueDrawRegion" o = Gtk.Widget.WidgetQueueDrawRegionMethodInfo
ResolveShortcutSimpleLabelMethod "queueResize" o = Gtk.Widget.WidgetQueueResizeMethodInfo
ResolveShortcutSimpleLabelMethod "queueResizeNoRedraw" o = Gtk.Widget.WidgetQueueResizeNoRedrawMethodInfo
ResolveShortcutSimpleLabelMethod "realize" o = Gtk.Widget.WidgetRealizeMethodInfo
ResolveShortcutSimpleLabelMethod "ref" o = GObject.Object.ObjectRefMethodInfo
ResolveShortcutSimpleLabelMethod "refSink" o = GObject.Object.ObjectRefSinkMethodInfo
ResolveShortcutSimpleLabelMethod "regionIntersect" o = Gtk.Widget.WidgetRegionIntersectMethodInfo
ResolveShortcutSimpleLabelMethod "registerWindow" o = Gtk.Widget.WidgetRegisterWindowMethodInfo
ResolveShortcutSimpleLabelMethod "remove" o = Gtk.Container.ContainerRemoveMethodInfo
ResolveShortcutSimpleLabelMethod "removeAccelerator" o = Gtk.Widget.WidgetRemoveAcceleratorMethodInfo
ResolveShortcutSimpleLabelMethod "removeMnemonicLabel" o = Gtk.Widget.WidgetRemoveMnemonicLabelMethodInfo
ResolveShortcutSimpleLabelMethod "removeTickCallback" o = Gtk.Widget.WidgetRemoveTickCallbackMethodInfo
ResolveShortcutSimpleLabelMethod "renderIcon" o = Gtk.Widget.WidgetRenderIconMethodInfo
ResolveShortcutSimpleLabelMethod "renderIconPixbuf" o = Gtk.Widget.WidgetRenderIconPixbufMethodInfo
ResolveShortcutSimpleLabelMethod "reorderChild" o = Gtk.Box.BoxReorderChildMethodInfo
ResolveShortcutSimpleLabelMethod "reparent" o = Gtk.Widget.WidgetReparentMethodInfo
ResolveShortcutSimpleLabelMethod "resetRcStyles" o = Gtk.Widget.WidgetResetRcStylesMethodInfo
ResolveShortcutSimpleLabelMethod "resetStyle" o = Gtk.Widget.WidgetResetStyleMethodInfo
ResolveShortcutSimpleLabelMethod "resizeChildren" o = Gtk.Container.ContainerResizeChildrenMethodInfo
ResolveShortcutSimpleLabelMethod "runDispose" o = GObject.Object.ObjectRunDisposeMethodInfo
ResolveShortcutSimpleLabelMethod "sendExpose" o = Gtk.Widget.WidgetSendExposeMethodInfo
ResolveShortcutSimpleLabelMethod "sendFocusChange" o = Gtk.Widget.WidgetSendFocusChangeMethodInfo
ResolveShortcutSimpleLabelMethod "shapeCombineRegion" o = Gtk.Widget.WidgetShapeCombineRegionMethodInfo
ResolveShortcutSimpleLabelMethod "show" o = Gtk.Widget.WidgetShowMethodInfo
ResolveShortcutSimpleLabelMethod "showAll" o = Gtk.Widget.WidgetShowAllMethodInfo
ResolveShortcutSimpleLabelMethod "showNow" o = Gtk.Widget.WidgetShowNowMethodInfo
ResolveShortcutSimpleLabelMethod "sizeAllocate" o = Gtk.Widget.WidgetSizeAllocateMethodInfo
ResolveShortcutSimpleLabelMethod "sizeAllocateWithBaseline" o = Gtk.Widget.WidgetSizeAllocateWithBaselineMethodInfo
ResolveShortcutSimpleLabelMethod "sizeRequest" o = Gtk.Widget.WidgetSizeRequestMethodInfo
ResolveShortcutSimpleLabelMethod "stealData" o = GObject.Object.ObjectStealDataMethodInfo
ResolveShortcutSimpleLabelMethod "stealQdata" o = GObject.Object.ObjectStealQdataMethodInfo
ResolveShortcutSimpleLabelMethod "styleAttach" o = Gtk.Widget.WidgetStyleAttachMethodInfo
ResolveShortcutSimpleLabelMethod "styleGetProperty" o = Gtk.Widget.WidgetStyleGetPropertyMethodInfo
ResolveShortcutSimpleLabelMethod "thawChildNotify" o = Gtk.Widget.WidgetThawChildNotifyMethodInfo
ResolveShortcutSimpleLabelMethod "thawNotify" o = GObject.Object.ObjectThawNotifyMethodInfo
ResolveShortcutSimpleLabelMethod "translateCoordinates" o = Gtk.Widget.WidgetTranslateCoordinatesMethodInfo
ResolveShortcutSimpleLabelMethod "triggerTooltipQuery" o = Gtk.Widget.WidgetTriggerTooltipQueryMethodInfo
ResolveShortcutSimpleLabelMethod "unmap" o = Gtk.Widget.WidgetUnmapMethodInfo
ResolveShortcutSimpleLabelMethod "unparent" o = Gtk.Widget.WidgetUnparentMethodInfo
ResolveShortcutSimpleLabelMethod "unrealize" o = Gtk.Widget.WidgetUnrealizeMethodInfo
ResolveShortcutSimpleLabelMethod "unref" o = GObject.Object.ObjectUnrefMethodInfo
ResolveShortcutSimpleLabelMethod "unregisterWindow" o = Gtk.Widget.WidgetUnregisterWindowMethodInfo
ResolveShortcutSimpleLabelMethod "unsetFocusChain" o = Gtk.Container.ContainerUnsetFocusChainMethodInfo
ResolveShortcutSimpleLabelMethod "unsetStateFlags" o = Gtk.Widget.WidgetUnsetStateFlagsMethodInfo
ResolveShortcutSimpleLabelMethod "watchClosure" o = GObject.Object.ObjectWatchClosureMethodInfo
ResolveShortcutSimpleLabelMethod "getAccel" o = ShortcutSimpleLabelGetAccelMethodInfo
ResolveShortcutSimpleLabelMethod "getAccessible" o = Gtk.Widget.WidgetGetAccessibleMethodInfo
ResolveShortcutSimpleLabelMethod "getAction" o = ShortcutSimpleLabelGetActionMethodInfo
ResolveShortcutSimpleLabelMethod "getActionGroup" o = Gtk.Widget.WidgetGetActionGroupMethodInfo
ResolveShortcutSimpleLabelMethod "getAllocatedBaseline" o = Gtk.Widget.WidgetGetAllocatedBaselineMethodInfo
ResolveShortcutSimpleLabelMethod "getAllocatedHeight" o = Gtk.Widget.WidgetGetAllocatedHeightMethodInfo
ResolveShortcutSimpleLabelMethod "getAllocatedSize" o = Gtk.Widget.WidgetGetAllocatedSizeMethodInfo
ResolveShortcutSimpleLabelMethod "getAllocatedWidth" o = Gtk.Widget.WidgetGetAllocatedWidthMethodInfo
ResolveShortcutSimpleLabelMethod "getAllocation" o = Gtk.Widget.WidgetGetAllocationMethodInfo
ResolveShortcutSimpleLabelMethod "getAncestor" o = Gtk.Widget.WidgetGetAncestorMethodInfo
ResolveShortcutSimpleLabelMethod "getAppPaintable" o = Gtk.Widget.WidgetGetAppPaintableMethodInfo
ResolveShortcutSimpleLabelMethod "getBaselinePosition" o = Gtk.Box.BoxGetBaselinePositionMethodInfo
ResolveShortcutSimpleLabelMethod "getBorderWidth" o = Gtk.Container.ContainerGetBorderWidthMethodInfo
ResolveShortcutSimpleLabelMethod "getCanDefault" o = Gtk.Widget.WidgetGetCanDefaultMethodInfo
ResolveShortcutSimpleLabelMethod "getCanFocus" o = Gtk.Widget.WidgetGetCanFocusMethodInfo
ResolveShortcutSimpleLabelMethod "getCenterWidget" o = Gtk.Box.BoxGetCenterWidgetMethodInfo
ResolveShortcutSimpleLabelMethod "getChildRequisition" o = Gtk.Widget.WidgetGetChildRequisitionMethodInfo
ResolveShortcutSimpleLabelMethod "getChildVisible" o = Gtk.Widget.WidgetGetChildVisibleMethodInfo
ResolveShortcutSimpleLabelMethod "getChildren" o = Gtk.Container.ContainerGetChildrenMethodInfo
ResolveShortcutSimpleLabelMethod "getClip" o = Gtk.Widget.WidgetGetClipMethodInfo
ResolveShortcutSimpleLabelMethod "getClipboard" o = Gtk.Widget.WidgetGetClipboardMethodInfo
ResolveShortcutSimpleLabelMethod "getCommand" o = ShortcutSimpleLabelGetCommandMethodInfo
ResolveShortcutSimpleLabelMethod "getCompositeName" o = Gtk.Widget.WidgetGetCompositeNameMethodInfo
ResolveShortcutSimpleLabelMethod "getData" o = GObject.Object.ObjectGetDataMethodInfo
ResolveShortcutSimpleLabelMethod "getDeviceEnabled" o = Gtk.Widget.WidgetGetDeviceEnabledMethodInfo
ResolveShortcutSimpleLabelMethod "getDeviceEvents" o = Gtk.Widget.WidgetGetDeviceEventsMethodInfo
ResolveShortcutSimpleLabelMethod "getDirection" o = Gtk.Widget.WidgetGetDirectionMethodInfo
ResolveShortcutSimpleLabelMethod "getDisplay" o = Gtk.Widget.WidgetGetDisplayMethodInfo
ResolveShortcutSimpleLabelMethod "getDoubleBuffered" o = Gtk.Widget.WidgetGetDoubleBufferedMethodInfo
ResolveShortcutSimpleLabelMethod "getEvents" o = Gtk.Widget.WidgetGetEventsMethodInfo
ResolveShortcutSimpleLabelMethod "getFocusChain" o = Gtk.Container.ContainerGetFocusChainMethodInfo
ResolveShortcutSimpleLabelMethod "getFocusChild" o = Gtk.Container.ContainerGetFocusChildMethodInfo
ResolveShortcutSimpleLabelMethod "getFocusHadjustment" o = Gtk.Container.ContainerGetFocusHadjustmentMethodInfo
ResolveShortcutSimpleLabelMethod "getFocusOnClick" o = Gtk.Widget.WidgetGetFocusOnClickMethodInfo
ResolveShortcutSimpleLabelMethod "getFocusVadjustment" o = Gtk.Container.ContainerGetFocusVadjustmentMethodInfo
ResolveShortcutSimpleLabelMethod "getFontMap" o = Gtk.Widget.WidgetGetFontMapMethodInfo
ResolveShortcutSimpleLabelMethod "getFontOptions" o = Gtk.Widget.WidgetGetFontOptionsMethodInfo
ResolveShortcutSimpleLabelMethod "getFrameClock" o = Gtk.Widget.WidgetGetFrameClockMethodInfo
ResolveShortcutSimpleLabelMethod "getHalign" o = Gtk.Widget.WidgetGetHalignMethodInfo
ResolveShortcutSimpleLabelMethod "getHasTooltip" o = Gtk.Widget.WidgetGetHasTooltipMethodInfo
ResolveShortcutSimpleLabelMethod "getHasWindow" o = Gtk.Widget.WidgetGetHasWindowMethodInfo
ResolveShortcutSimpleLabelMethod "getHexpand" o = Gtk.Widget.WidgetGetHexpandMethodInfo
ResolveShortcutSimpleLabelMethod "getHexpandSet" o = Gtk.Widget.WidgetGetHexpandSetMethodInfo
ResolveShortcutSimpleLabelMethod "getHomogeneous" o = Gtk.Box.BoxGetHomogeneousMethodInfo
ResolveShortcutSimpleLabelMethod "getInternalChild" o = Gtk.Buildable.BuildableGetInternalChildMethodInfo
ResolveShortcutSimpleLabelMethod "getMapped" o = Gtk.Widget.WidgetGetMappedMethodInfo
ResolveShortcutSimpleLabelMethod "getMarginBottom" o = Gtk.Widget.WidgetGetMarginBottomMethodInfo
ResolveShortcutSimpleLabelMethod "getMarginEnd" o = Gtk.Widget.WidgetGetMarginEndMethodInfo
ResolveShortcutSimpleLabelMethod "getMarginLeft" o = Gtk.Widget.WidgetGetMarginLeftMethodInfo
ResolveShortcutSimpleLabelMethod "getMarginRight" o = Gtk.Widget.WidgetGetMarginRightMethodInfo
ResolveShortcutSimpleLabelMethod "getMarginStart" o = Gtk.Widget.WidgetGetMarginStartMethodInfo
ResolveShortcutSimpleLabelMethod "getMarginTop" o = Gtk.Widget.WidgetGetMarginTopMethodInfo
ResolveShortcutSimpleLabelMethod "getModifierMask" o = Gtk.Widget.WidgetGetModifierMaskMethodInfo
ResolveShortcutSimpleLabelMethod "getModifierStyle" o = Gtk.Widget.WidgetGetModifierStyleMethodInfo
ResolveShortcutSimpleLabelMethod "getName" o = Gtk.Widget.WidgetGetNameMethodInfo
ResolveShortcutSimpleLabelMethod "getNoShowAll" o = Gtk.Widget.WidgetGetNoShowAllMethodInfo
ResolveShortcutSimpleLabelMethod "getOpacity" o = Gtk.Widget.WidgetGetOpacityMethodInfo
ResolveShortcutSimpleLabelMethod "getOrientation" o = Gtk.Orientable.OrientableGetOrientationMethodInfo
ResolveShortcutSimpleLabelMethod "getPangoContext" o = Gtk.Widget.WidgetGetPangoContextMethodInfo
ResolveShortcutSimpleLabelMethod "getParent" o = Gtk.Widget.WidgetGetParentMethodInfo
ResolveShortcutSimpleLabelMethod "getParentWindow" o = Gtk.Widget.WidgetGetParentWindowMethodInfo
ResolveShortcutSimpleLabelMethod "getPath" o = Gtk.Widget.WidgetGetPathMethodInfo
ResolveShortcutSimpleLabelMethod "getPathForChild" o = Gtk.Container.ContainerGetPathForChildMethodInfo
ResolveShortcutSimpleLabelMethod "getPointer" o = Gtk.Widget.WidgetGetPointerMethodInfo
ResolveShortcutSimpleLabelMethod "getPreferredHeight" o = Gtk.Widget.WidgetGetPreferredHeightMethodInfo
ResolveShortcutSimpleLabelMethod "getPreferredHeightAndBaselineForWidth" o = Gtk.Widget.WidgetGetPreferredHeightAndBaselineForWidthMethodInfo
ResolveShortcutSimpleLabelMethod "getPreferredHeightForWidth" o = Gtk.Widget.WidgetGetPreferredHeightForWidthMethodInfo
ResolveShortcutSimpleLabelMethod "getPreferredSize" o = Gtk.Widget.WidgetGetPreferredSizeMethodInfo
ResolveShortcutSimpleLabelMethod "getPreferredWidth" o = Gtk.Widget.WidgetGetPreferredWidthMethodInfo
ResolveShortcutSimpleLabelMethod "getPreferredWidthForHeight" o = Gtk.Widget.WidgetGetPreferredWidthForHeightMethodInfo
ResolveShortcutSimpleLabelMethod "getProperty" o = GObject.Object.ObjectGetPropertyMethodInfo
ResolveShortcutSimpleLabelMethod "getQdata" o = GObject.Object.ObjectGetQdataMethodInfo
ResolveShortcutSimpleLabelMethod "getRealized" o = Gtk.Widget.WidgetGetRealizedMethodInfo
ResolveShortcutSimpleLabelMethod "getReceivesDefault" o = Gtk.Widget.WidgetGetReceivesDefaultMethodInfo
ResolveShortcutSimpleLabelMethod "getRequestMode" o = Gtk.Widget.WidgetGetRequestModeMethodInfo
ResolveShortcutSimpleLabelMethod "getRequisition" o = Gtk.Widget.WidgetGetRequisitionMethodInfo
ResolveShortcutSimpleLabelMethod "getResizeMode" o = Gtk.Container.ContainerGetResizeModeMethodInfo
ResolveShortcutSimpleLabelMethod "getRootWindow" o = Gtk.Widget.WidgetGetRootWindowMethodInfo
ResolveShortcutSimpleLabelMethod "getScaleFactor" o = Gtk.Widget.WidgetGetScaleFactorMethodInfo
ResolveShortcutSimpleLabelMethod "getScreen" o = Gtk.Widget.WidgetGetScreenMethodInfo
ResolveShortcutSimpleLabelMethod "getSensitive" o = Gtk.Widget.WidgetGetSensitiveMethodInfo
ResolveShortcutSimpleLabelMethod "getSettings" o = Gtk.Widget.WidgetGetSettingsMethodInfo
ResolveShortcutSimpleLabelMethod "getSizeRequest" o = Gtk.Widget.WidgetGetSizeRequestMethodInfo
ResolveShortcutSimpleLabelMethod "getSpacing" o = Gtk.Box.BoxGetSpacingMethodInfo
ResolveShortcutSimpleLabelMethod "getState" o = Gtk.Widget.WidgetGetStateMethodInfo
ResolveShortcutSimpleLabelMethod "getStateFlags" o = Gtk.Widget.WidgetGetStateFlagsMethodInfo
ResolveShortcutSimpleLabelMethod "getStyle" o = Gtk.Widget.WidgetGetStyleMethodInfo
ResolveShortcutSimpleLabelMethod "getStyleContext" o = Gtk.Widget.WidgetGetStyleContextMethodInfo
ResolveShortcutSimpleLabelMethod "getSupportMultidevice" o = Gtk.Widget.WidgetGetSupportMultideviceMethodInfo
ResolveShortcutSimpleLabelMethod "getTemplateChild" o = Gtk.Widget.WidgetGetTemplateChildMethodInfo
ResolveShortcutSimpleLabelMethod "getTitle" o = ShortcutSimpleLabelGetTitleMethodInfo
ResolveShortcutSimpleLabelMethod "getTooltipMarkup" o = Gtk.Widget.WidgetGetTooltipMarkupMethodInfo
ResolveShortcutSimpleLabelMethod "getTooltipText" o = Gtk.Widget.WidgetGetTooltipTextMethodInfo
ResolveShortcutSimpleLabelMethod "getTooltipWindow" o = Gtk.Widget.WidgetGetTooltipWindowMethodInfo
ResolveShortcutSimpleLabelMethod "getToplevel" o = Gtk.Widget.WidgetGetToplevelMethodInfo
ResolveShortcutSimpleLabelMethod "getValign" o = Gtk.Widget.WidgetGetValignMethodInfo
ResolveShortcutSimpleLabelMethod "getValignWithBaseline" o = Gtk.Widget.WidgetGetValignWithBaselineMethodInfo
ResolveShortcutSimpleLabelMethod "getVexpand" o = Gtk.Widget.WidgetGetVexpandMethodInfo
ResolveShortcutSimpleLabelMethod "getVexpandSet" o = Gtk.Widget.WidgetGetVexpandSetMethodInfo
ResolveShortcutSimpleLabelMethod "getVisible" o = Gtk.Widget.WidgetGetVisibleMethodInfo
ResolveShortcutSimpleLabelMethod "getVisual" o = Gtk.Widget.WidgetGetVisualMethodInfo
ResolveShortcutSimpleLabelMethod "getWindow" o = Gtk.Widget.WidgetGetWindowMethodInfo
ResolveShortcutSimpleLabelMethod "setAccel" o = ShortcutSimpleLabelSetAccelMethodInfo
ResolveShortcutSimpleLabelMethod "setAccelPath" o = Gtk.Widget.WidgetSetAccelPathMethodInfo
ResolveShortcutSimpleLabelMethod "setAction" o = ShortcutSimpleLabelSetActionMethodInfo
ResolveShortcutSimpleLabelMethod "setAllocation" o = Gtk.Widget.WidgetSetAllocationMethodInfo
ResolveShortcutSimpleLabelMethod "setAppPaintable" o = Gtk.Widget.WidgetSetAppPaintableMethodInfo
ResolveShortcutSimpleLabelMethod "setBaselinePosition" o = Gtk.Box.BoxSetBaselinePositionMethodInfo
ResolveShortcutSimpleLabelMethod "setBorderWidth" o = Gtk.Container.ContainerSetBorderWidthMethodInfo
ResolveShortcutSimpleLabelMethod "setBuildableProperty" o = Gtk.Buildable.BuildableSetBuildablePropertyMethodInfo
ResolveShortcutSimpleLabelMethod "setCanDefault" o = Gtk.Widget.WidgetSetCanDefaultMethodInfo
ResolveShortcutSimpleLabelMethod "setCanFocus" o = Gtk.Widget.WidgetSetCanFocusMethodInfo
ResolveShortcutSimpleLabelMethod "setCenterWidget" o = Gtk.Box.BoxSetCenterWidgetMethodInfo
ResolveShortcutSimpleLabelMethod "setChildPacking" o = Gtk.Box.BoxSetChildPackingMethodInfo
ResolveShortcutSimpleLabelMethod "setChildVisible" o = Gtk.Widget.WidgetSetChildVisibleMethodInfo
ResolveShortcutSimpleLabelMethod "setClip" o = Gtk.Widget.WidgetSetClipMethodInfo
ResolveShortcutSimpleLabelMethod "setCommand" o = ShortcutSimpleLabelSetCommandMethodInfo
ResolveShortcutSimpleLabelMethod "setCompositeName" o = Gtk.Widget.WidgetSetCompositeNameMethodInfo
ResolveShortcutSimpleLabelMethod "setData" o = GObject.Object.ObjectSetDataMethodInfo
ResolveShortcutSimpleLabelMethod "setDataFull" o = GObject.Object.ObjectSetDataFullMethodInfo
ResolveShortcutSimpleLabelMethod "setDeviceEnabled" o = Gtk.Widget.WidgetSetDeviceEnabledMethodInfo
ResolveShortcutSimpleLabelMethod "setDeviceEvents" o = Gtk.Widget.WidgetSetDeviceEventsMethodInfo
ResolveShortcutSimpleLabelMethod "setDirection" o = Gtk.Widget.WidgetSetDirectionMethodInfo
ResolveShortcutSimpleLabelMethod "setDoubleBuffered" o = Gtk.Widget.WidgetSetDoubleBufferedMethodInfo
ResolveShortcutSimpleLabelMethod "setEvents" o = Gtk.Widget.WidgetSetEventsMethodInfo
ResolveShortcutSimpleLabelMethod "setFocusChain" o = Gtk.Container.ContainerSetFocusChainMethodInfo
ResolveShortcutSimpleLabelMethod "setFocusChild" o = Gtk.Container.ContainerSetFocusChildMethodInfo
ResolveShortcutSimpleLabelMethod "setFocusHadjustment" o = Gtk.Container.ContainerSetFocusHadjustmentMethodInfo
ResolveShortcutSimpleLabelMethod "setFocusOnClick" o = Gtk.Widget.WidgetSetFocusOnClickMethodInfo
ResolveShortcutSimpleLabelMethod "setFocusVadjustment" o = Gtk.Container.ContainerSetFocusVadjustmentMethodInfo
ResolveShortcutSimpleLabelMethod "setFontMap" o = Gtk.Widget.WidgetSetFontMapMethodInfo
ResolveShortcutSimpleLabelMethod "setFontOptions" o = Gtk.Widget.WidgetSetFontOptionsMethodInfo
ResolveShortcutSimpleLabelMethod "setHalign" o = Gtk.Widget.WidgetSetHalignMethodInfo
ResolveShortcutSimpleLabelMethod "setHasTooltip" o = Gtk.Widget.WidgetSetHasTooltipMethodInfo
ResolveShortcutSimpleLabelMethod "setHasWindow" o = Gtk.Widget.WidgetSetHasWindowMethodInfo
ResolveShortcutSimpleLabelMethod "setHexpand" o = Gtk.Widget.WidgetSetHexpandMethodInfo
ResolveShortcutSimpleLabelMethod "setHexpandSet" o = Gtk.Widget.WidgetSetHexpandSetMethodInfo
ResolveShortcutSimpleLabelMethod "setHomogeneous" o = Gtk.Box.BoxSetHomogeneousMethodInfo
ResolveShortcutSimpleLabelMethod "setMapped" o = Gtk.Widget.WidgetSetMappedMethodInfo
ResolveShortcutSimpleLabelMethod "setMarginBottom" o = Gtk.Widget.WidgetSetMarginBottomMethodInfo
ResolveShortcutSimpleLabelMethod "setMarginEnd" o = Gtk.Widget.WidgetSetMarginEndMethodInfo
ResolveShortcutSimpleLabelMethod "setMarginLeft" o = Gtk.Widget.WidgetSetMarginLeftMethodInfo
ResolveShortcutSimpleLabelMethod "setMarginRight" o = Gtk.Widget.WidgetSetMarginRightMethodInfo
ResolveShortcutSimpleLabelMethod "setMarginStart" o = Gtk.Widget.WidgetSetMarginStartMethodInfo
ResolveShortcutSimpleLabelMethod "setMarginTop" o = Gtk.Widget.WidgetSetMarginTopMethodInfo
ResolveShortcutSimpleLabelMethod "setName" o = Gtk.Widget.WidgetSetNameMethodInfo
ResolveShortcutSimpleLabelMethod "setNoShowAll" o = Gtk.Widget.WidgetSetNoShowAllMethodInfo
ResolveShortcutSimpleLabelMethod "setOpacity" o = Gtk.Widget.WidgetSetOpacityMethodInfo
ResolveShortcutSimpleLabelMethod "setOrientation" o = Gtk.Orientable.OrientableSetOrientationMethodInfo
ResolveShortcutSimpleLabelMethod "setParent" o = Gtk.Widget.WidgetSetParentMethodInfo
ResolveShortcutSimpleLabelMethod "setParentWindow" o = Gtk.Widget.WidgetSetParentWindowMethodInfo
ResolveShortcutSimpleLabelMethod "setProperty" o = GObject.Object.ObjectSetPropertyMethodInfo
ResolveShortcutSimpleLabelMethod "setRealized" o = Gtk.Widget.WidgetSetRealizedMethodInfo
ResolveShortcutSimpleLabelMethod "setReallocateRedraws" o = Gtk.Container.ContainerSetReallocateRedrawsMethodInfo
ResolveShortcutSimpleLabelMethod "setReceivesDefault" o = Gtk.Widget.WidgetSetReceivesDefaultMethodInfo
ResolveShortcutSimpleLabelMethod "setRedrawOnAllocate" o = Gtk.Widget.WidgetSetRedrawOnAllocateMethodInfo
ResolveShortcutSimpleLabelMethod "setResizeMode" o = Gtk.Container.ContainerSetResizeModeMethodInfo
ResolveShortcutSimpleLabelMethod "setSensitive" o = Gtk.Widget.WidgetSetSensitiveMethodInfo
ResolveShortcutSimpleLabelMethod "setSizeRequest" o = Gtk.Widget.WidgetSetSizeRequestMethodInfo
ResolveShortcutSimpleLabelMethod "setSpacing" o = Gtk.Box.BoxSetSpacingMethodInfo
ResolveShortcutSimpleLabelMethod "setState" o = Gtk.Widget.WidgetSetStateMethodInfo
ResolveShortcutSimpleLabelMethod "setStateFlags" o = Gtk.Widget.WidgetSetStateFlagsMethodInfo
ResolveShortcutSimpleLabelMethod "setStyle" o = Gtk.Widget.WidgetSetStyleMethodInfo
ResolveShortcutSimpleLabelMethod "setSupportMultidevice" o = Gtk.Widget.WidgetSetSupportMultideviceMethodInfo
ResolveShortcutSimpleLabelMethod "setTitle" o = ShortcutSimpleLabelSetTitleMethodInfo
ResolveShortcutSimpleLabelMethod "setTooltipMarkup" o = Gtk.Widget.WidgetSetTooltipMarkupMethodInfo
ResolveShortcutSimpleLabelMethod "setTooltipText" o = Gtk.Widget.WidgetSetTooltipTextMethodInfo
ResolveShortcutSimpleLabelMethod "setTooltipWindow" o = Gtk.Widget.WidgetSetTooltipWindowMethodInfo
ResolveShortcutSimpleLabelMethod "setValign" o = Gtk.Widget.WidgetSetValignMethodInfo
ResolveShortcutSimpleLabelMethod "setVexpand" o = Gtk.Widget.WidgetSetVexpandMethodInfo
ResolveShortcutSimpleLabelMethod "setVexpandSet" o = Gtk.Widget.WidgetSetVexpandSetMethodInfo
ResolveShortcutSimpleLabelMethod "setVisible" o = Gtk.Widget.WidgetSetVisibleMethodInfo
ResolveShortcutSimpleLabelMethod "setVisual" o = Gtk.Widget.WidgetSetVisualMethodInfo
ResolveShortcutSimpleLabelMethod "setWindow" o = Gtk.Widget.WidgetSetWindowMethodInfo
ResolveShortcutSimpleLabelMethod l o = O.MethodResolutionFailed l o
instance (info ~ ResolveShortcutSimpleLabelMethod t ShortcutSimpleLabel, O.OverloadedMethod info ShortcutSimpleLabel p) => OL.IsLabel t (ShortcutSimpleLabel -> 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 ~ ResolveShortcutSimpleLabelMethod t ShortcutSimpleLabel, O.OverloadedMethod info ShortcutSimpleLabel p, R.HasField t ShortcutSimpleLabel p) => R.HasField t ShortcutSimpleLabel p where
getField = O.overloadedMethod @info
#endif
instance (info ~ ResolveShortcutSimpleLabelMethod t ShortcutSimpleLabel, O.OverloadedMethodInfo info ShortcutSimpleLabel) => OL.IsLabel t (O.MethodProxy info ShortcutSimpleLabel) where
#if MIN_VERSION_base(4,10,0)
fromLabel = O.MethodProxy
#else
fromLabel _ = O.MethodProxy
#endif
#endif
getShortcutSimpleLabelAccel :: (MonadIO m, IsShortcutSimpleLabel o) => o -> m T.Text
getShortcutSimpleLabelAccel :: forall (m :: * -> *) o.
(MonadIO m, IsShortcutSimpleLabel o) =>
o -> m Text
getShortcutSimpleLabelAccel o
obj = IO Text -> m Text
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO Text -> m Text) -> IO Text -> m Text
forall a b. (a -> b) -> a -> b
$ Text -> IO (Maybe Text) -> IO Text
forall a. HasCallStack => Text -> IO (Maybe a) -> IO a
checkUnexpectedNothing Text
"getShortcutSimpleLabelAccel" (IO (Maybe Text) -> IO Text) -> IO (Maybe Text) -> IO Text
forall a b. (a -> b) -> a -> b
$ o -> String -> IO (Maybe Text)
forall a. GObject a => a -> String -> IO (Maybe Text)
B.Properties.getObjectPropertyString o
obj String
"accel"
setShortcutSimpleLabelAccel :: (MonadIO m, IsShortcutSimpleLabel o) => o -> T.Text -> m ()
setShortcutSimpleLabelAccel :: forall (m :: * -> *) o.
(MonadIO m, IsShortcutSimpleLabel o) =>
o -> Text -> m ()
setShortcutSimpleLabelAccel o
obj Text
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 -> Maybe Text -> IO ()
forall a. GObject a => a -> String -> Maybe Text -> IO ()
B.Properties.setObjectPropertyString o
obj String
"accel" (Text -> Maybe Text
forall a. a -> Maybe a
Just Text
val)
constructShortcutSimpleLabelAccel :: (IsShortcutSimpleLabel o, MIO.MonadIO m) => T.Text -> m (GValueConstruct o)
constructShortcutSimpleLabelAccel :: forall o (m :: * -> *).
(IsShortcutSimpleLabel o, MonadIO m) =>
Text -> m (GValueConstruct o)
constructShortcutSimpleLabelAccel Text
val = IO (GValueConstruct o) -> m (GValueConstruct o)
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (GValueConstruct o) -> m (GValueConstruct o))
-> IO (GValueConstruct o) -> m (GValueConstruct o)
forall a b. (a -> b) -> a -> b
$ do
IO (GValueConstruct o) -> IO (GValueConstruct o)
forall a. IO a -> IO a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (GValueConstruct o) -> IO (GValueConstruct o))
-> IO (GValueConstruct o) -> IO (GValueConstruct o)
forall a b. (a -> b) -> a -> b
$ String -> Maybe Text -> IO (GValueConstruct o)
forall o. String -> Maybe Text -> IO (GValueConstruct o)
B.Properties.constructObjectPropertyString String
"accel" (Text -> Maybe Text
forall a. a -> Maybe a
P.Just Text
val)
#if defined(ENABLE_OVERLOADING)
data ShortcutSimpleLabelAccelPropertyInfo
instance AttrInfo ShortcutSimpleLabelAccelPropertyInfo where
type AttrAllowedOps ShortcutSimpleLabelAccelPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
type AttrBaseTypeConstraint ShortcutSimpleLabelAccelPropertyInfo = IsShortcutSimpleLabel
type AttrSetTypeConstraint ShortcutSimpleLabelAccelPropertyInfo = (~) T.Text
type AttrTransferTypeConstraint ShortcutSimpleLabelAccelPropertyInfo = (~) T.Text
type AttrTransferType ShortcutSimpleLabelAccelPropertyInfo = T.Text
type AttrGetType ShortcutSimpleLabelAccelPropertyInfo = T.Text
type AttrLabel ShortcutSimpleLabelAccelPropertyInfo = "accel"
type AttrOrigin ShortcutSimpleLabelAccelPropertyInfo = ShortcutSimpleLabel
attrGet = getShortcutSimpleLabelAccel
attrSet = setShortcutSimpleLabelAccel
attrTransfer _ v = do
return v
attrConstruct = constructShortcutSimpleLabelAccel
attrClear = undefined
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.ShortcutSimpleLabel.accel"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-ShortcutSimpleLabel.html#g:attr:accel"
})
#endif
getShortcutSimpleLabelAction :: (MonadIO m, IsShortcutSimpleLabel o) => o -> m T.Text
getShortcutSimpleLabelAction :: forall (m :: * -> *) o.
(MonadIO m, IsShortcutSimpleLabel o) =>
o -> m Text
getShortcutSimpleLabelAction o
obj = IO Text -> m Text
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO Text -> m Text) -> IO Text -> m Text
forall a b. (a -> b) -> a -> b
$ Text -> IO (Maybe Text) -> IO Text
forall a. HasCallStack => Text -> IO (Maybe a) -> IO a
checkUnexpectedNothing Text
"getShortcutSimpleLabelAction" (IO (Maybe Text) -> IO Text) -> IO (Maybe Text) -> IO Text
forall a b. (a -> b) -> a -> b
$ o -> String -> IO (Maybe Text)
forall a. GObject a => a -> String -> IO (Maybe Text)
B.Properties.getObjectPropertyString o
obj String
"action"
setShortcutSimpleLabelAction :: (MonadIO m, IsShortcutSimpleLabel o) => o -> T.Text -> m ()
setShortcutSimpleLabelAction :: forall (m :: * -> *) o.
(MonadIO m, IsShortcutSimpleLabel o) =>
o -> Text -> m ()
setShortcutSimpleLabelAction o
obj Text
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 -> Maybe Text -> IO ()
forall a. GObject a => a -> String -> Maybe Text -> IO ()
B.Properties.setObjectPropertyString o
obj String
"action" (Text -> Maybe Text
forall a. a -> Maybe a
Just Text
val)
constructShortcutSimpleLabelAction :: (IsShortcutSimpleLabel o, MIO.MonadIO m) => T.Text -> m (GValueConstruct o)
constructShortcutSimpleLabelAction :: forall o (m :: * -> *).
(IsShortcutSimpleLabel o, MonadIO m) =>
Text -> m (GValueConstruct o)
constructShortcutSimpleLabelAction Text
val = IO (GValueConstruct o) -> m (GValueConstruct o)
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (GValueConstruct o) -> m (GValueConstruct o))
-> IO (GValueConstruct o) -> m (GValueConstruct o)
forall a b. (a -> b) -> a -> b
$ do
IO (GValueConstruct o) -> IO (GValueConstruct o)
forall a. IO a -> IO a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (GValueConstruct o) -> IO (GValueConstruct o))
-> IO (GValueConstruct o) -> IO (GValueConstruct o)
forall a b. (a -> b) -> a -> b
$ String -> Maybe Text -> IO (GValueConstruct o)
forall o. String -> Maybe Text -> IO (GValueConstruct o)
B.Properties.constructObjectPropertyString String
"action" (Text -> Maybe Text
forall a. a -> Maybe a
P.Just Text
val)
#if defined(ENABLE_OVERLOADING)
data ShortcutSimpleLabelActionPropertyInfo
instance AttrInfo ShortcutSimpleLabelActionPropertyInfo where
type AttrAllowedOps ShortcutSimpleLabelActionPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
type AttrBaseTypeConstraint ShortcutSimpleLabelActionPropertyInfo = IsShortcutSimpleLabel
type AttrSetTypeConstraint ShortcutSimpleLabelActionPropertyInfo = (~) T.Text
type AttrTransferTypeConstraint ShortcutSimpleLabelActionPropertyInfo = (~) T.Text
type AttrTransferType ShortcutSimpleLabelActionPropertyInfo = T.Text
type AttrGetType ShortcutSimpleLabelActionPropertyInfo = T.Text
type AttrLabel ShortcutSimpleLabelActionPropertyInfo = "action"
type AttrOrigin ShortcutSimpleLabelActionPropertyInfo = ShortcutSimpleLabel
attrGet = getShortcutSimpleLabelAction
attrSet = setShortcutSimpleLabelAction
attrTransfer _ v = do
return v
attrConstruct = constructShortcutSimpleLabelAction
attrClear = undefined
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.ShortcutSimpleLabel.action"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-ShortcutSimpleLabel.html#g:attr:action"
})
#endif
getShortcutSimpleLabelCommand :: (MonadIO m, IsShortcutSimpleLabel o) => o -> m T.Text
getShortcutSimpleLabelCommand :: forall (m :: * -> *) o.
(MonadIO m, IsShortcutSimpleLabel o) =>
o -> m Text
getShortcutSimpleLabelCommand o
obj = IO Text -> m Text
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO Text -> m Text) -> IO Text -> m Text
forall a b. (a -> b) -> a -> b
$ Text -> IO (Maybe Text) -> IO Text
forall a. HasCallStack => Text -> IO (Maybe a) -> IO a
checkUnexpectedNothing Text
"getShortcutSimpleLabelCommand" (IO (Maybe Text) -> IO Text) -> IO (Maybe Text) -> IO Text
forall a b. (a -> b) -> a -> b
$ o -> String -> IO (Maybe Text)
forall a. GObject a => a -> String -> IO (Maybe Text)
B.Properties.getObjectPropertyString o
obj String
"command"
setShortcutSimpleLabelCommand :: (MonadIO m, IsShortcutSimpleLabel o) => o -> T.Text -> m ()
setShortcutSimpleLabelCommand :: forall (m :: * -> *) o.
(MonadIO m, IsShortcutSimpleLabel o) =>
o -> Text -> m ()
setShortcutSimpleLabelCommand o
obj Text
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 -> Maybe Text -> IO ()
forall a. GObject a => a -> String -> Maybe Text -> IO ()
B.Properties.setObjectPropertyString o
obj String
"command" (Text -> Maybe Text
forall a. a -> Maybe a
Just Text
val)
constructShortcutSimpleLabelCommand :: (IsShortcutSimpleLabel o, MIO.MonadIO m) => T.Text -> m (GValueConstruct o)
constructShortcutSimpleLabelCommand :: forall o (m :: * -> *).
(IsShortcutSimpleLabel o, MonadIO m) =>
Text -> m (GValueConstruct o)
constructShortcutSimpleLabelCommand Text
val = IO (GValueConstruct o) -> m (GValueConstruct o)
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (GValueConstruct o) -> m (GValueConstruct o))
-> IO (GValueConstruct o) -> m (GValueConstruct o)
forall a b. (a -> b) -> a -> b
$ do
IO (GValueConstruct o) -> IO (GValueConstruct o)
forall a. IO a -> IO a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (GValueConstruct o) -> IO (GValueConstruct o))
-> IO (GValueConstruct o) -> IO (GValueConstruct o)
forall a b. (a -> b) -> a -> b
$ String -> Maybe Text -> IO (GValueConstruct o)
forall o. String -> Maybe Text -> IO (GValueConstruct o)
B.Properties.constructObjectPropertyString String
"command" (Text -> Maybe Text
forall a. a -> Maybe a
P.Just Text
val)
#if defined(ENABLE_OVERLOADING)
data ShortcutSimpleLabelCommandPropertyInfo
instance AttrInfo ShortcutSimpleLabelCommandPropertyInfo where
type AttrAllowedOps ShortcutSimpleLabelCommandPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
type AttrBaseTypeConstraint ShortcutSimpleLabelCommandPropertyInfo = IsShortcutSimpleLabel
type AttrSetTypeConstraint ShortcutSimpleLabelCommandPropertyInfo = (~) T.Text
type AttrTransferTypeConstraint ShortcutSimpleLabelCommandPropertyInfo = (~) T.Text
type AttrTransferType ShortcutSimpleLabelCommandPropertyInfo = T.Text
type AttrGetType ShortcutSimpleLabelCommandPropertyInfo = T.Text
type AttrLabel ShortcutSimpleLabelCommandPropertyInfo = "command"
type AttrOrigin ShortcutSimpleLabelCommandPropertyInfo = ShortcutSimpleLabel
attrGet = getShortcutSimpleLabelCommand
attrSet = setShortcutSimpleLabelCommand
attrTransfer _ v = do
return v
attrConstruct = constructShortcutSimpleLabelCommand
attrClear = undefined
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.ShortcutSimpleLabel.command"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-ShortcutSimpleLabel.html#g:attr:command"
})
#endif
getShortcutSimpleLabelShowAccel :: (MonadIO m, IsShortcutSimpleLabel o) => o -> m Bool
getShortcutSimpleLabelShowAccel :: forall (m :: * -> *) o.
(MonadIO m, IsShortcutSimpleLabel o) =>
o -> m Bool
getShortcutSimpleLabelShowAccel 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-accel"
setShortcutSimpleLabelShowAccel :: (MonadIO m, IsShortcutSimpleLabel o) => o -> Bool -> m ()
setShortcutSimpleLabelShowAccel :: forall (m :: * -> *) o.
(MonadIO m, IsShortcutSimpleLabel o) =>
o -> Bool -> m ()
setShortcutSimpleLabelShowAccel 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-accel" Bool
val
constructShortcutSimpleLabelShowAccel :: (IsShortcutSimpleLabel o, MIO.MonadIO m) => Bool -> m (GValueConstruct o)
constructShortcutSimpleLabelShowAccel :: forall o (m :: * -> *).
(IsShortcutSimpleLabel o, MonadIO m) =>
Bool -> m (GValueConstruct o)
constructShortcutSimpleLabelShowAccel 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-accel" Bool
val
#if defined(ENABLE_OVERLOADING)
data ShortcutSimpleLabelShowAccelPropertyInfo
instance AttrInfo ShortcutSimpleLabelShowAccelPropertyInfo where
type AttrAllowedOps ShortcutSimpleLabelShowAccelPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
type AttrBaseTypeConstraint ShortcutSimpleLabelShowAccelPropertyInfo = IsShortcutSimpleLabel
type AttrSetTypeConstraint ShortcutSimpleLabelShowAccelPropertyInfo = (~) Bool
type AttrTransferTypeConstraint ShortcutSimpleLabelShowAccelPropertyInfo = (~) Bool
type AttrTransferType ShortcutSimpleLabelShowAccelPropertyInfo = Bool
type AttrGetType ShortcutSimpleLabelShowAccelPropertyInfo = Bool
type AttrLabel ShortcutSimpleLabelShowAccelPropertyInfo = "show-accel"
type AttrOrigin ShortcutSimpleLabelShowAccelPropertyInfo = ShortcutSimpleLabel
attrGet = getShortcutSimpleLabelShowAccel
attrSet = setShortcutSimpleLabelShowAccel
attrTransfer _ v = do
return v
attrConstruct = constructShortcutSimpleLabelShowAccel
attrClear = undefined
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.ShortcutSimpleLabel.showAccel"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-ShortcutSimpleLabel.html#g:attr:showAccel"
})
#endif
getShortcutSimpleLabelTitle :: (MonadIO m, IsShortcutSimpleLabel o) => o -> m T.Text
getShortcutSimpleLabelTitle :: forall (m :: * -> *) o.
(MonadIO m, IsShortcutSimpleLabel o) =>
o -> m Text
getShortcutSimpleLabelTitle o
obj = IO Text -> m Text
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO Text -> m Text) -> IO Text -> m Text
forall a b. (a -> b) -> a -> b
$ Text -> IO (Maybe Text) -> IO Text
forall a. HasCallStack => Text -> IO (Maybe a) -> IO a
checkUnexpectedNothing Text
"getShortcutSimpleLabelTitle" (IO (Maybe Text) -> IO Text) -> IO (Maybe Text) -> IO Text
forall a b. (a -> b) -> a -> b
$ o -> String -> IO (Maybe Text)
forall a. GObject a => a -> String -> IO (Maybe Text)
B.Properties.getObjectPropertyString o
obj String
"title"
setShortcutSimpleLabelTitle :: (MonadIO m, IsShortcutSimpleLabel o) => o -> T.Text -> m ()
setShortcutSimpleLabelTitle :: forall (m :: * -> *) o.
(MonadIO m, IsShortcutSimpleLabel o) =>
o -> Text -> m ()
setShortcutSimpleLabelTitle o
obj Text
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 -> Maybe Text -> IO ()
forall a. GObject a => a -> String -> Maybe Text -> IO ()
B.Properties.setObjectPropertyString o
obj String
"title" (Text -> Maybe Text
forall a. a -> Maybe a
Just Text
val)
constructShortcutSimpleLabelTitle :: (IsShortcutSimpleLabel o, MIO.MonadIO m) => T.Text -> m (GValueConstruct o)
constructShortcutSimpleLabelTitle :: forall o (m :: * -> *).
(IsShortcutSimpleLabel o, MonadIO m) =>
Text -> m (GValueConstruct o)
constructShortcutSimpleLabelTitle Text
val = IO (GValueConstruct o) -> m (GValueConstruct o)
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (GValueConstruct o) -> m (GValueConstruct o))
-> IO (GValueConstruct o) -> m (GValueConstruct o)
forall a b. (a -> b) -> a -> b
$ do
IO (GValueConstruct o) -> IO (GValueConstruct o)
forall a. IO a -> IO a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO (GValueConstruct o) -> IO (GValueConstruct o))
-> IO (GValueConstruct o) -> IO (GValueConstruct o)
forall a b. (a -> b) -> a -> b
$ String -> Maybe Text -> IO (GValueConstruct o)
forall o. String -> Maybe Text -> IO (GValueConstruct o)
B.Properties.constructObjectPropertyString String
"title" (Text -> Maybe Text
forall a. a -> Maybe a
P.Just Text
val)
#if defined(ENABLE_OVERLOADING)
data ShortcutSimpleLabelTitlePropertyInfo
instance AttrInfo ShortcutSimpleLabelTitlePropertyInfo where
type AttrAllowedOps ShortcutSimpleLabelTitlePropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
type AttrBaseTypeConstraint ShortcutSimpleLabelTitlePropertyInfo = IsShortcutSimpleLabel
type AttrSetTypeConstraint ShortcutSimpleLabelTitlePropertyInfo = (~) T.Text
type AttrTransferTypeConstraint ShortcutSimpleLabelTitlePropertyInfo = (~) T.Text
type AttrTransferType ShortcutSimpleLabelTitlePropertyInfo = T.Text
type AttrGetType ShortcutSimpleLabelTitlePropertyInfo = T.Text
type AttrLabel ShortcutSimpleLabelTitlePropertyInfo = "title"
type AttrOrigin ShortcutSimpleLabelTitlePropertyInfo = ShortcutSimpleLabel
attrGet = getShortcutSimpleLabelTitle
attrSet = setShortcutSimpleLabelTitle
attrTransfer _ v = do
return v
attrConstruct = constructShortcutSimpleLabelTitle
attrClear = undefined
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.ShortcutSimpleLabel.title"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-ShortcutSimpleLabel.html#g:attr:title"
})
#endif
#if defined(ENABLE_OVERLOADING)
instance O.HasAttributeList ShortcutSimpleLabel
type instance O.AttributeList ShortcutSimpleLabel = ShortcutSimpleLabelAttributeList
type ShortcutSimpleLabelAttributeList = ('[ '("accel", ShortcutSimpleLabelAccelPropertyInfo), '("action", ShortcutSimpleLabelActionPropertyInfo), '("appPaintable", Gtk.Widget.WidgetAppPaintablePropertyInfo), '("baselinePosition", Gtk.Box.BoxBaselinePositionPropertyInfo), '("borderWidth", Gtk.Container.ContainerBorderWidthPropertyInfo), '("canDefault", Gtk.Widget.WidgetCanDefaultPropertyInfo), '("canFocus", Gtk.Widget.WidgetCanFocusPropertyInfo), '("child", Gtk.Container.ContainerChildPropertyInfo), '("command", ShortcutSimpleLabelCommandPropertyInfo), '("compositeChild", Gtk.Widget.WidgetCompositeChildPropertyInfo), '("doubleBuffered", Gtk.Widget.WidgetDoubleBufferedPropertyInfo), '("events", Gtk.Widget.WidgetEventsPropertyInfo), '("expand", Gtk.Widget.WidgetExpandPropertyInfo), '("focusOnClick", Gtk.Widget.WidgetFocusOnClickPropertyInfo), '("halign", Gtk.Widget.WidgetHalignPropertyInfo), '("hasDefault", Gtk.Widget.WidgetHasDefaultPropertyInfo), '("hasFocus", Gtk.Widget.WidgetHasFocusPropertyInfo), '("hasTooltip", Gtk.Widget.WidgetHasTooltipPropertyInfo), '("heightRequest", Gtk.Widget.WidgetHeightRequestPropertyInfo), '("hexpand", Gtk.Widget.WidgetHexpandPropertyInfo), '("hexpandSet", Gtk.Widget.WidgetHexpandSetPropertyInfo), '("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), '("showAccel", ShortcutSimpleLabelShowAccelPropertyInfo), '("spacing", Gtk.Box.BoxSpacingPropertyInfo), '("style", Gtk.Widget.WidgetStylePropertyInfo), '("title", ShortcutSimpleLabelTitlePropertyInfo), '("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)
shortcutSimpleLabelAccel :: AttrLabelProxy "accel"
shortcutSimpleLabelAccel = AttrLabelProxy
shortcutSimpleLabelAction :: AttrLabelProxy "action"
shortcutSimpleLabelAction = AttrLabelProxy
shortcutSimpleLabelCommand :: AttrLabelProxy "command"
shortcutSimpleLabelCommand = AttrLabelProxy
shortcutSimpleLabelShowAccel :: AttrLabelProxy "showAccel"
shortcutSimpleLabelShowAccel = AttrLabelProxy
shortcutSimpleLabelTitle :: AttrLabelProxy "title"
shortcutSimpleLabelTitle = AttrLabelProxy
#endif
#if defined(ENABLE_OVERLOADING)
type instance O.SignalList ShortcutSimpleLabel = ShortcutSimpleLabelSignalList
type ShortcutSimpleLabelSignalList = ('[ '("accelClosuresChanged", Gtk.Widget.WidgetAccelClosuresChangedSignalInfo), '("add", Gtk.Container.ContainerAddSignalInfo), '("buttonPressEvent", Gtk.Widget.WidgetButtonPressEventSignalInfo), '("buttonReleaseEvent", Gtk.Widget.WidgetButtonReleaseEventSignalInfo), '("canActivateAccel", Gtk.Widget.WidgetCanActivateAccelSignalInfo), '("checkResize", Gtk.Container.ContainerCheckResizeSignalInfo), '("childNotify", Gtk.Widget.WidgetChildNotifySignalInfo), '("compositedChanged", Gtk.Widget.WidgetCompositedChangedSignalInfo), '("configureEvent", Gtk.Widget.WidgetConfigureEventSignalInfo), '("damageEvent", Gtk.Widget.WidgetDamageEventSignalInfo), '("deleteEvent", Gtk.Widget.WidgetDeleteEventSignalInfo), '("destroy", Gtk.Widget.WidgetDestroySignalInfo), '("destroyEvent", Gtk.Widget.WidgetDestroyEventSignalInfo), '("directionChanged", Gtk.Widget.WidgetDirectionChangedSignalInfo), '("dragBegin", Gtk.Widget.WidgetDragBeginSignalInfo), '("dragDataDelete", Gtk.Widget.WidgetDragDataDeleteSignalInfo), '("dragDataGet", Gtk.Widget.WidgetDragDataGetSignalInfo), '("dragDataReceived", Gtk.Widget.WidgetDragDataReceivedSignalInfo), '("dragDrop", Gtk.Widget.WidgetDragDropSignalInfo), '("dragEnd", Gtk.Widget.WidgetDragEndSignalInfo), '("dragFailed", Gtk.Widget.WidgetDragFailedSignalInfo), '("dragLeave", Gtk.Widget.WidgetDragLeaveSignalInfo), '("dragMotion", Gtk.Widget.WidgetDragMotionSignalInfo), '("draw", Gtk.Widget.WidgetDrawSignalInfo), '("enterNotifyEvent", Gtk.Widget.WidgetEnterNotifyEventSignalInfo), '("event", Gtk.Widget.WidgetEventSignalInfo), '("eventAfter", Gtk.Widget.WidgetEventAfterSignalInfo), '("focus", Gtk.Widget.WidgetFocusSignalInfo), '("focusInEvent", Gtk.Widget.WidgetFocusInEventSignalInfo), '("focusOutEvent", Gtk.Widget.WidgetFocusOutEventSignalInfo), '("grabBrokenEvent", Gtk.Widget.WidgetGrabBrokenEventSignalInfo), '("grabFocus", Gtk.Widget.WidgetGrabFocusSignalInfo), '("grabNotify", Gtk.Widget.WidgetGrabNotifySignalInfo), '("hide", Gtk.Widget.WidgetHideSignalInfo), '("hierarchyChanged", Gtk.Widget.WidgetHierarchyChangedSignalInfo), '("keyPressEvent", Gtk.Widget.WidgetKeyPressEventSignalInfo), '("keyReleaseEvent", Gtk.Widget.WidgetKeyReleaseEventSignalInfo), '("keynavFailed", Gtk.Widget.WidgetKeynavFailedSignalInfo), '("leaveNotifyEvent", Gtk.Widget.WidgetLeaveNotifyEventSignalInfo), '("map", Gtk.Widget.WidgetMapSignalInfo), '("mapEvent", Gtk.Widget.WidgetMapEventSignalInfo), '("mnemonicActivate", Gtk.Widget.WidgetMnemonicActivateSignalInfo), '("motionNotifyEvent", Gtk.Widget.WidgetMotionNotifyEventSignalInfo), '("moveFocus", Gtk.Widget.WidgetMoveFocusSignalInfo), '("notify", GObject.Object.ObjectNotifySignalInfo), '("parentSet", Gtk.Widget.WidgetParentSetSignalInfo), '("popupMenu", Gtk.Widget.WidgetPopupMenuSignalInfo), '("propertyNotifyEvent", Gtk.Widget.WidgetPropertyNotifyEventSignalInfo), '("proximityInEvent", Gtk.Widget.WidgetProximityInEventSignalInfo), '("proximityOutEvent", Gtk.Widget.WidgetProximityOutEventSignalInfo), '("queryTooltip", Gtk.Widget.WidgetQueryTooltipSignalInfo), '("realize", Gtk.Widget.WidgetRealizeSignalInfo), '("remove", Gtk.Container.ContainerRemoveSignalInfo), '("screenChanged", Gtk.Widget.WidgetScreenChangedSignalInfo), '("scrollEvent", Gtk.Widget.WidgetScrollEventSignalInfo), '("selectionClearEvent", Gtk.Widget.WidgetSelectionClearEventSignalInfo), '("selectionGet", Gtk.Widget.WidgetSelectionGetSignalInfo), '("selectionNotifyEvent", Gtk.Widget.WidgetSelectionNotifyEventSignalInfo), '("selectionReceived", Gtk.Widget.WidgetSelectionReceivedSignalInfo), '("selectionRequestEvent", Gtk.Widget.WidgetSelectionRequestEventSignalInfo), '("setFocusChild", Gtk.Container.ContainerSetFocusChildSignalInfo), '("show", Gtk.Widget.WidgetShowSignalInfo), '("showHelp", Gtk.Widget.WidgetShowHelpSignalInfo), '("sizeAllocate", Gtk.Widget.WidgetSizeAllocateSignalInfo), '("stateChanged", Gtk.Widget.WidgetStateChangedSignalInfo), '("stateFlagsChanged", Gtk.Widget.WidgetStateFlagsChangedSignalInfo), '("styleSet", Gtk.Widget.WidgetStyleSetSignalInfo), '("styleUpdated", Gtk.Widget.WidgetStyleUpdatedSignalInfo), '("touchEvent", Gtk.Widget.WidgetTouchEventSignalInfo), '("unmap", Gtk.Widget.WidgetUnmapSignalInfo), '("unmapEvent", Gtk.Widget.WidgetUnmapEventSignalInfo), '("unrealize", Gtk.Widget.WidgetUnrealizeSignalInfo), '("visibilityNotifyEvent", Gtk.Widget.WidgetVisibilityNotifyEventSignalInfo), '("windowStateEvent", Gtk.Widget.WidgetWindowStateEventSignalInfo)] :: [(Symbol, DK.Type)])
#endif
foreign import ccall "dzl_shortcut_simple_label_new" dzl_shortcut_simple_label_new ::
IO (Ptr ShortcutSimpleLabel)
shortcutSimpleLabelNew ::
(B.CallStack.HasCallStack, MonadIO m) =>
m ShortcutSimpleLabel
shortcutSimpleLabelNew :: forall (m :: * -> *).
(HasCallStack, MonadIO m) =>
m ShortcutSimpleLabel
shortcutSimpleLabelNew = IO ShortcutSimpleLabel -> m ShortcutSimpleLabel
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO ShortcutSimpleLabel -> m ShortcutSimpleLabel)
-> IO ShortcutSimpleLabel -> m ShortcutSimpleLabel
forall a b. (a -> b) -> a -> b
$ do
Ptr ShortcutSimpleLabel
result <- IO (Ptr ShortcutSimpleLabel)
dzl_shortcut_simple_label_new
Text -> Ptr ShortcutSimpleLabel -> IO ()
forall a. HasCallStack => Text -> Ptr a -> IO ()
checkUnexpectedReturnNULL Text
"shortcutSimpleLabelNew" Ptr ShortcutSimpleLabel
result
ShortcutSimpleLabel
result' <- ((ManagedPtr ShortcutSimpleLabel -> ShortcutSimpleLabel)
-> Ptr ShortcutSimpleLabel -> IO ShortcutSimpleLabel
forall a b.
(HasCallStack, GObject a, GObject b) =>
(ManagedPtr a -> a) -> Ptr b -> IO a
newObject ManagedPtr ShortcutSimpleLabel -> ShortcutSimpleLabel
ShortcutSimpleLabel) Ptr ShortcutSimpleLabel
result
ShortcutSimpleLabel -> IO ShortcutSimpleLabel
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return ShortcutSimpleLabel
result'
#if defined(ENABLE_OVERLOADING)
#endif
foreign import ccall "dzl_shortcut_simple_label_get_accel" dzl_shortcut_simple_label_get_accel ::
Ptr ShortcutSimpleLabel ->
IO CString
shortcutSimpleLabelGetAccel ::
(B.CallStack.HasCallStack, MonadIO m, IsShortcutSimpleLabel a) =>
a
-> m T.Text
shortcutSimpleLabelGetAccel :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsShortcutSimpleLabel a) =>
a -> m Text
shortcutSimpleLabelGetAccel a
self = IO Text -> m Text
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO Text -> m Text) -> IO Text -> m Text
forall a b. (a -> b) -> a -> b
$ do
Ptr ShortcutSimpleLabel
self' <- a -> IO (Ptr ShortcutSimpleLabel)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
CString
result <- Ptr ShortcutSimpleLabel -> IO CString
dzl_shortcut_simple_label_get_accel Ptr ShortcutSimpleLabel
self'
Text -> CString -> IO ()
forall a. HasCallStack => Text -> Ptr a -> IO ()
checkUnexpectedReturnNULL Text
"shortcutSimpleLabelGetAccel" CString
result
Text
result' <- HasCallStack => CString -> IO Text
CString -> IO Text
cstringToText CString
result
a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
self
Text -> IO Text
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return Text
result'
#if defined(ENABLE_OVERLOADING)
data ShortcutSimpleLabelGetAccelMethodInfo
instance (signature ~ (m T.Text), MonadIO m, IsShortcutSimpleLabel a) => O.OverloadedMethod ShortcutSimpleLabelGetAccelMethodInfo a signature where
overloadedMethod = shortcutSimpleLabelGetAccel
instance O.OverloadedMethodInfo ShortcutSimpleLabelGetAccelMethodInfo a where
overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.ShortcutSimpleLabel.shortcutSimpleLabelGetAccel",
O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-ShortcutSimpleLabel.html#v:shortcutSimpleLabelGetAccel"
})
#endif
foreign import ccall "dzl_shortcut_simple_label_get_action" dzl_shortcut_simple_label_get_action ::
Ptr ShortcutSimpleLabel ->
IO CString
shortcutSimpleLabelGetAction ::
(B.CallStack.HasCallStack, MonadIO m, IsShortcutSimpleLabel a) =>
a
-> m T.Text
shortcutSimpleLabelGetAction :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsShortcutSimpleLabel a) =>
a -> m Text
shortcutSimpleLabelGetAction a
self = IO Text -> m Text
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO Text -> m Text) -> IO Text -> m Text
forall a b. (a -> b) -> a -> b
$ do
Ptr ShortcutSimpleLabel
self' <- a -> IO (Ptr ShortcutSimpleLabel)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
CString
result <- Ptr ShortcutSimpleLabel -> IO CString
dzl_shortcut_simple_label_get_action Ptr ShortcutSimpleLabel
self'
Text -> CString -> IO ()
forall a. HasCallStack => Text -> Ptr a -> IO ()
checkUnexpectedReturnNULL Text
"shortcutSimpleLabelGetAction" CString
result
Text
result' <- HasCallStack => CString -> IO Text
CString -> IO Text
cstringToText CString
result
a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
self
Text -> IO Text
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return Text
result'
#if defined(ENABLE_OVERLOADING)
data ShortcutSimpleLabelGetActionMethodInfo
instance (signature ~ (m T.Text), MonadIO m, IsShortcutSimpleLabel a) => O.OverloadedMethod ShortcutSimpleLabelGetActionMethodInfo a signature where
overloadedMethod = shortcutSimpleLabelGetAction
instance O.OverloadedMethodInfo ShortcutSimpleLabelGetActionMethodInfo a where
overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.ShortcutSimpleLabel.shortcutSimpleLabelGetAction",
O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-ShortcutSimpleLabel.html#v:shortcutSimpleLabelGetAction"
})
#endif
foreign import ccall "dzl_shortcut_simple_label_get_command" dzl_shortcut_simple_label_get_command ::
Ptr ShortcutSimpleLabel ->
IO CString
shortcutSimpleLabelGetCommand ::
(B.CallStack.HasCallStack, MonadIO m, IsShortcutSimpleLabel a) =>
a
-> m T.Text
shortcutSimpleLabelGetCommand :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsShortcutSimpleLabel a) =>
a -> m Text
shortcutSimpleLabelGetCommand a
self = IO Text -> m Text
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO Text -> m Text) -> IO Text -> m Text
forall a b. (a -> b) -> a -> b
$ do
Ptr ShortcutSimpleLabel
self' <- a -> IO (Ptr ShortcutSimpleLabel)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
CString
result <- Ptr ShortcutSimpleLabel -> IO CString
dzl_shortcut_simple_label_get_command Ptr ShortcutSimpleLabel
self'
Text -> CString -> IO ()
forall a. HasCallStack => Text -> Ptr a -> IO ()
checkUnexpectedReturnNULL Text
"shortcutSimpleLabelGetCommand" CString
result
Text
result' <- HasCallStack => CString -> IO Text
CString -> IO Text
cstringToText CString
result
a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
self
Text -> IO Text
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return Text
result'
#if defined(ENABLE_OVERLOADING)
data ShortcutSimpleLabelGetCommandMethodInfo
instance (signature ~ (m T.Text), MonadIO m, IsShortcutSimpleLabel a) => O.OverloadedMethod ShortcutSimpleLabelGetCommandMethodInfo a signature where
overloadedMethod = shortcutSimpleLabelGetCommand
instance O.OverloadedMethodInfo ShortcutSimpleLabelGetCommandMethodInfo a where
overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.ShortcutSimpleLabel.shortcutSimpleLabelGetCommand",
O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-ShortcutSimpleLabel.html#v:shortcutSimpleLabelGetCommand"
})
#endif
foreign import ccall "dzl_shortcut_simple_label_get_title" dzl_shortcut_simple_label_get_title ::
Ptr ShortcutSimpleLabel ->
IO CString
shortcutSimpleLabelGetTitle ::
(B.CallStack.HasCallStack, MonadIO m, IsShortcutSimpleLabel a) =>
a
-> m T.Text
shortcutSimpleLabelGetTitle :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsShortcutSimpleLabel a) =>
a -> m Text
shortcutSimpleLabelGetTitle a
self = IO Text -> m Text
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO Text -> m Text) -> IO Text -> m Text
forall a b. (a -> b) -> a -> b
$ do
Ptr ShortcutSimpleLabel
self' <- a -> IO (Ptr ShortcutSimpleLabel)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
CString
result <- Ptr ShortcutSimpleLabel -> IO CString
dzl_shortcut_simple_label_get_title Ptr ShortcutSimpleLabel
self'
Text -> CString -> IO ()
forall a. HasCallStack => Text -> Ptr a -> IO ()
checkUnexpectedReturnNULL Text
"shortcutSimpleLabelGetTitle" CString
result
Text
result' <- HasCallStack => CString -> IO Text
CString -> IO Text
cstringToText CString
result
a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
self
Text -> IO Text
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return Text
result'
#if defined(ENABLE_OVERLOADING)
data ShortcutSimpleLabelGetTitleMethodInfo
instance (signature ~ (m T.Text), MonadIO m, IsShortcutSimpleLabel a) => O.OverloadedMethod ShortcutSimpleLabelGetTitleMethodInfo a signature where
overloadedMethod = shortcutSimpleLabelGetTitle
instance O.OverloadedMethodInfo ShortcutSimpleLabelGetTitleMethodInfo a where
overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.ShortcutSimpleLabel.shortcutSimpleLabelGetTitle",
O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-ShortcutSimpleLabel.html#v:shortcutSimpleLabelGetTitle"
})
#endif
foreign import ccall "dzl_shortcut_simple_label_set_accel" dzl_shortcut_simple_label_set_accel ::
Ptr ShortcutSimpleLabel ->
CString ->
IO ()
shortcutSimpleLabelSetAccel ::
(B.CallStack.HasCallStack, MonadIO m, IsShortcutSimpleLabel a) =>
a
-> T.Text
-> m ()
shortcutSimpleLabelSetAccel :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsShortcutSimpleLabel a) =>
a -> Text -> m ()
shortcutSimpleLabelSetAccel a
self Text
accel = 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 ShortcutSimpleLabel
self' <- a -> IO (Ptr ShortcutSimpleLabel)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
CString
accel' <- Text -> IO CString
textToCString Text
accel
Ptr ShortcutSimpleLabel -> CString -> IO ()
dzl_shortcut_simple_label_set_accel Ptr ShortcutSimpleLabel
self' CString
accel'
a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
self
CString -> IO ()
forall a. Ptr a -> IO ()
freeMem CString
accel'
() -> IO ()
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return ()
#if defined(ENABLE_OVERLOADING)
data ShortcutSimpleLabelSetAccelMethodInfo
instance (signature ~ (T.Text -> m ()), MonadIO m, IsShortcutSimpleLabel a) => O.OverloadedMethod ShortcutSimpleLabelSetAccelMethodInfo a signature where
overloadedMethod = shortcutSimpleLabelSetAccel
instance O.OverloadedMethodInfo ShortcutSimpleLabelSetAccelMethodInfo a where
overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.ShortcutSimpleLabel.shortcutSimpleLabelSetAccel",
O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-ShortcutSimpleLabel.html#v:shortcutSimpleLabelSetAccel"
})
#endif
foreign import ccall "dzl_shortcut_simple_label_set_action" dzl_shortcut_simple_label_set_action ::
Ptr ShortcutSimpleLabel ->
CString ->
IO ()
shortcutSimpleLabelSetAction ::
(B.CallStack.HasCallStack, MonadIO m, IsShortcutSimpleLabel a) =>
a
-> T.Text
-> m ()
shortcutSimpleLabelSetAction :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsShortcutSimpleLabel a) =>
a -> Text -> m ()
shortcutSimpleLabelSetAction a
self Text
action = 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 ShortcutSimpleLabel
self' <- a -> IO (Ptr ShortcutSimpleLabel)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
CString
action' <- Text -> IO CString
textToCString Text
action
Ptr ShortcutSimpleLabel -> CString -> IO ()
dzl_shortcut_simple_label_set_action Ptr ShortcutSimpleLabel
self' CString
action'
a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
self
CString -> IO ()
forall a. Ptr a -> IO ()
freeMem CString
action'
() -> IO ()
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return ()
#if defined(ENABLE_OVERLOADING)
data ShortcutSimpleLabelSetActionMethodInfo
instance (signature ~ (T.Text -> m ()), MonadIO m, IsShortcutSimpleLabel a) => O.OverloadedMethod ShortcutSimpleLabelSetActionMethodInfo a signature where
overloadedMethod = shortcutSimpleLabelSetAction
instance O.OverloadedMethodInfo ShortcutSimpleLabelSetActionMethodInfo a where
overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.ShortcutSimpleLabel.shortcutSimpleLabelSetAction",
O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-ShortcutSimpleLabel.html#v:shortcutSimpleLabelSetAction"
})
#endif
foreign import ccall "dzl_shortcut_simple_label_set_command" dzl_shortcut_simple_label_set_command ::
Ptr ShortcutSimpleLabel ->
CString ->
IO ()
shortcutSimpleLabelSetCommand ::
(B.CallStack.HasCallStack, MonadIO m, IsShortcutSimpleLabel a) =>
a
-> T.Text
-> m ()
shortcutSimpleLabelSetCommand :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsShortcutSimpleLabel a) =>
a -> Text -> m ()
shortcutSimpleLabelSetCommand a
self Text
command = 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 ShortcutSimpleLabel
self' <- a -> IO (Ptr ShortcutSimpleLabel)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
CString
command' <- Text -> IO CString
textToCString Text
command
Ptr ShortcutSimpleLabel -> CString -> IO ()
dzl_shortcut_simple_label_set_command Ptr ShortcutSimpleLabel
self' CString
command'
a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
self
CString -> IO ()
forall a. Ptr a -> IO ()
freeMem CString
command'
() -> IO ()
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return ()
#if defined(ENABLE_OVERLOADING)
data ShortcutSimpleLabelSetCommandMethodInfo
instance (signature ~ (T.Text -> m ()), MonadIO m, IsShortcutSimpleLabel a) => O.OverloadedMethod ShortcutSimpleLabelSetCommandMethodInfo a signature where
overloadedMethod = shortcutSimpleLabelSetCommand
instance O.OverloadedMethodInfo ShortcutSimpleLabelSetCommandMethodInfo a where
overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.ShortcutSimpleLabel.shortcutSimpleLabelSetCommand",
O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-ShortcutSimpleLabel.html#v:shortcutSimpleLabelSetCommand"
})
#endif
foreign import ccall "dzl_shortcut_simple_label_set_title" dzl_shortcut_simple_label_set_title ::
Ptr ShortcutSimpleLabel ->
CString ->
IO ()
shortcutSimpleLabelSetTitle ::
(B.CallStack.HasCallStack, MonadIO m, IsShortcutSimpleLabel a) =>
a
-> T.Text
-> m ()
shortcutSimpleLabelSetTitle :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsShortcutSimpleLabel a) =>
a -> Text -> m ()
shortcutSimpleLabelSetTitle a
self Text
title = 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 ShortcutSimpleLabel
self' <- a -> IO (Ptr ShortcutSimpleLabel)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
CString
title' <- Text -> IO CString
textToCString Text
title
Ptr ShortcutSimpleLabel -> CString -> IO ()
dzl_shortcut_simple_label_set_title Ptr ShortcutSimpleLabel
self' CString
title'
a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
self
CString -> IO ()
forall a. Ptr a -> IO ()
freeMem CString
title'
() -> IO ()
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return ()
#if defined(ENABLE_OVERLOADING)
data ShortcutSimpleLabelSetTitleMethodInfo
instance (signature ~ (T.Text -> m ()), MonadIO m, IsShortcutSimpleLabel a) => O.OverloadedMethod ShortcutSimpleLabelSetTitleMethodInfo a signature where
overloadedMethod = shortcutSimpleLabelSetTitle
instance O.OverloadedMethodInfo ShortcutSimpleLabelSetTitleMethodInfo a where
overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.ShortcutSimpleLabel.shortcutSimpleLabelSetTitle",
O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-ShortcutSimpleLabel.html#v:shortcutSimpleLabelSetTitle"
})
#endif