{-# LANGUAGE TypeApplications #-}
#if (MIN_VERSION_haskell_gi_overloading(1,0,0) && !defined(__HADDOCK_VERSION__))
#define ENABLE_OVERLOADING
#endif
module GI.Dazzle.Objects.SimpleLabel
(
SimpleLabel(..) ,
IsSimpleLabel ,
toSimpleLabel ,
#if defined(ENABLE_OVERLOADING)
ResolveSimpleLabelMethod ,
#endif
#if defined(ENABLE_OVERLOADING)
SimpleLabelGetLabelMethodInfo ,
#endif
simpleLabelGetLabel ,
#if defined(ENABLE_OVERLOADING)
SimpleLabelGetWidthCharsMethodInfo ,
#endif
simpleLabelGetWidthChars ,
#if defined(ENABLE_OVERLOADING)
SimpleLabelGetXalignMethodInfo ,
#endif
simpleLabelGetXalign ,
simpleLabelNew ,
#if defined(ENABLE_OVERLOADING)
SimpleLabelSetLabelMethodInfo ,
#endif
simpleLabelSetLabel ,
#if defined(ENABLE_OVERLOADING)
SimpleLabelSetWidthCharsMethodInfo ,
#endif
simpleLabelSetWidthChars ,
#if defined(ENABLE_OVERLOADING)
SimpleLabelSetXalignMethodInfo ,
#endif
simpleLabelSetXalign ,
#if defined(ENABLE_OVERLOADING)
SimpleLabelLabelPropertyInfo ,
#endif
constructSimpleLabelLabel ,
getSimpleLabelLabel ,
setSimpleLabelLabel ,
#if defined(ENABLE_OVERLOADING)
simpleLabelLabel ,
#endif
#if defined(ENABLE_OVERLOADING)
SimpleLabelWidthCharsPropertyInfo ,
#endif
constructSimpleLabelWidthChars ,
getSimpleLabelWidthChars ,
setSimpleLabelWidthChars ,
#if defined(ENABLE_OVERLOADING)
simpleLabelWidthChars ,
#endif
#if defined(ENABLE_OVERLOADING)
SimpleLabelXalignPropertyInfo ,
#endif
constructSimpleLabelXalign ,
getSimpleLabelXalign ,
setSimpleLabelXalign ,
#if defined(ENABLE_OVERLOADING)
simpleLabelXalign ,
#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.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.Objects.Widget as Gtk.Widget
#endif
newtype SimpleLabel = SimpleLabel (SP.ManagedPtr SimpleLabel)
deriving (SimpleLabel -> SimpleLabel -> Bool
(SimpleLabel -> SimpleLabel -> Bool)
-> (SimpleLabel -> SimpleLabel -> Bool) -> Eq SimpleLabel
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: SimpleLabel -> SimpleLabel -> Bool
== :: SimpleLabel -> SimpleLabel -> Bool
$c/= :: SimpleLabel -> SimpleLabel -> Bool
/= :: SimpleLabel -> SimpleLabel -> Bool
Eq)
instance SP.ManagedPtrNewtype SimpleLabel where
toManagedPtr :: SimpleLabel -> ManagedPtr SimpleLabel
toManagedPtr (SimpleLabel ManagedPtr SimpleLabel
p) = ManagedPtr SimpleLabel
p
foreign import ccall "dzl_simple_label_get_type"
c_dzl_simple_label_get_type :: IO B.Types.GType
instance B.Types.TypedObject SimpleLabel where
glibType :: IO GType
glibType = IO GType
c_dzl_simple_label_get_type
instance B.Types.GObject SimpleLabel
class (SP.GObject o, O.IsDescendantOf SimpleLabel o) => IsSimpleLabel o
instance (SP.GObject o, O.IsDescendantOf SimpleLabel o) => IsSimpleLabel o
instance O.HasParentTypes SimpleLabel
type instance O.ParentTypes SimpleLabel = '[Gtk.Widget.Widget, GObject.Object.Object, Atk.ImplementorIface.ImplementorIface, Gtk.Buildable.Buildable]
toSimpleLabel :: (MIO.MonadIO m, IsSimpleLabel o) => o -> m SimpleLabel
toSimpleLabel :: forall (m :: * -> *) o.
(MonadIO m, IsSimpleLabel o) =>
o -> m SimpleLabel
toSimpleLabel = IO SimpleLabel -> m SimpleLabel
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO SimpleLabel -> m SimpleLabel)
-> (o -> IO SimpleLabel) -> o -> m SimpleLabel
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (ManagedPtr SimpleLabel -> SimpleLabel) -> o -> IO SimpleLabel
forall o o'.
(HasCallStack, ManagedPtrNewtype o, TypedObject o,
ManagedPtrNewtype o', TypedObject o') =>
(ManagedPtr o' -> o') -> o -> IO o'
B.ManagedPtr.unsafeCastTo ManagedPtr SimpleLabel -> SimpleLabel
SimpleLabel
instance B.GValue.IsGValue (Maybe SimpleLabel) where
gvalueGType_ :: IO GType
gvalueGType_ = IO GType
c_dzl_simple_label_get_type
gvalueSet_ :: Ptr GValue -> Maybe SimpleLabel -> IO ()
gvalueSet_ Ptr GValue
gv Maybe SimpleLabel
P.Nothing = Ptr GValue -> Ptr SimpleLabel -> IO ()
forall a. GObject a => Ptr GValue -> Ptr a -> IO ()
B.GValue.set_object Ptr GValue
gv (Ptr SimpleLabel
forall a. Ptr a
FP.nullPtr :: FP.Ptr SimpleLabel)
gvalueSet_ Ptr GValue
gv (P.Just SimpleLabel
obj) = SimpleLabel -> (Ptr SimpleLabel -> IO ()) -> IO ()
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
B.ManagedPtr.withManagedPtr SimpleLabel
obj (Ptr GValue -> Ptr SimpleLabel -> IO ()
forall a. GObject a => Ptr GValue -> Ptr a -> IO ()
B.GValue.set_object Ptr GValue
gv)
gvalueGet_ :: Ptr GValue -> IO (Maybe SimpleLabel)
gvalueGet_ Ptr GValue
gv = do
Ptr SimpleLabel
ptr <- Ptr GValue -> IO (Ptr SimpleLabel)
forall a. GObject a => Ptr GValue -> IO (Ptr a)
B.GValue.get_object Ptr GValue
gv :: IO (FP.Ptr SimpleLabel)
if Ptr SimpleLabel
ptr Ptr SimpleLabel -> Ptr SimpleLabel -> Bool
forall a. Eq a => a -> a -> Bool
/= Ptr SimpleLabel
forall a. Ptr a
FP.nullPtr
then SimpleLabel -> Maybe SimpleLabel
forall a. a -> Maybe a
P.Just (SimpleLabel -> Maybe SimpleLabel)
-> IO SimpleLabel -> IO (Maybe SimpleLabel)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> (ManagedPtr SimpleLabel -> SimpleLabel)
-> Ptr SimpleLabel -> IO SimpleLabel
forall a b.
(HasCallStack, GObject a, GObject b) =>
(ManagedPtr a -> a) -> Ptr b -> IO a
B.ManagedPtr.newObject ManagedPtr SimpleLabel -> SimpleLabel
SimpleLabel Ptr SimpleLabel
ptr
else Maybe SimpleLabel -> IO (Maybe SimpleLabel)
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return Maybe SimpleLabel
forall a. Maybe a
P.Nothing
#if defined(ENABLE_OVERLOADING)
type family ResolveSimpleLabelMethod (t :: Symbol) (o :: DK.Type) :: DK.Type where
ResolveSimpleLabelMethod "activate" o = Gtk.Widget.WidgetActivateMethodInfo
ResolveSimpleLabelMethod "addAccelerator" o = Gtk.Widget.WidgetAddAcceleratorMethodInfo
ResolveSimpleLabelMethod "addChild" o = Gtk.Buildable.BuildableAddChildMethodInfo
ResolveSimpleLabelMethod "addDeviceEvents" o = Gtk.Widget.WidgetAddDeviceEventsMethodInfo
ResolveSimpleLabelMethod "addEvents" o = Gtk.Widget.WidgetAddEventsMethodInfo
ResolveSimpleLabelMethod "addMnemonicLabel" o = Gtk.Widget.WidgetAddMnemonicLabelMethodInfo
ResolveSimpleLabelMethod "addTickCallback" o = Gtk.Widget.WidgetAddTickCallbackMethodInfo
ResolveSimpleLabelMethod "bindProperty" o = GObject.Object.ObjectBindPropertyMethodInfo
ResolveSimpleLabelMethod "bindPropertyFull" o = GObject.Object.ObjectBindPropertyFullMethodInfo
ResolveSimpleLabelMethod "canActivateAccel" o = Gtk.Widget.WidgetCanActivateAccelMethodInfo
ResolveSimpleLabelMethod "childFocus" o = Gtk.Widget.WidgetChildFocusMethodInfo
ResolveSimpleLabelMethod "childNotify" o = Gtk.Widget.WidgetChildNotifyMethodInfo
ResolveSimpleLabelMethod "classPath" o = Gtk.Widget.WidgetClassPathMethodInfo
ResolveSimpleLabelMethod "computeExpand" o = Gtk.Widget.WidgetComputeExpandMethodInfo
ResolveSimpleLabelMethod "constructChild" o = Gtk.Buildable.BuildableConstructChildMethodInfo
ResolveSimpleLabelMethod "createPangoContext" o = Gtk.Widget.WidgetCreatePangoContextMethodInfo
ResolveSimpleLabelMethod "createPangoLayout" o = Gtk.Widget.WidgetCreatePangoLayoutMethodInfo
ResolveSimpleLabelMethod "customFinished" o = Gtk.Buildable.BuildableCustomFinishedMethodInfo
ResolveSimpleLabelMethod "customTagEnd" o = Gtk.Buildable.BuildableCustomTagEndMethodInfo
ResolveSimpleLabelMethod "customTagStart" o = Gtk.Buildable.BuildableCustomTagStartMethodInfo
ResolveSimpleLabelMethod "destroy" o = Gtk.Widget.WidgetDestroyMethodInfo
ResolveSimpleLabelMethod "destroyed" o = Gtk.Widget.WidgetDestroyedMethodInfo
ResolveSimpleLabelMethod "deviceIsShadowed" o = Gtk.Widget.WidgetDeviceIsShadowedMethodInfo
ResolveSimpleLabelMethod "dragBegin" o = Gtk.Widget.WidgetDragBeginMethodInfo
ResolveSimpleLabelMethod "dragBeginWithCoordinates" o = Gtk.Widget.WidgetDragBeginWithCoordinatesMethodInfo
ResolveSimpleLabelMethod "dragCheckThreshold" o = Gtk.Widget.WidgetDragCheckThresholdMethodInfo
ResolveSimpleLabelMethod "dragDestAddImageTargets" o = Gtk.Widget.WidgetDragDestAddImageTargetsMethodInfo
ResolveSimpleLabelMethod "dragDestAddTextTargets" o = Gtk.Widget.WidgetDragDestAddTextTargetsMethodInfo
ResolveSimpleLabelMethod "dragDestAddUriTargets" o = Gtk.Widget.WidgetDragDestAddUriTargetsMethodInfo
ResolveSimpleLabelMethod "dragDestFindTarget" o = Gtk.Widget.WidgetDragDestFindTargetMethodInfo
ResolveSimpleLabelMethod "dragDestGetTargetList" o = Gtk.Widget.WidgetDragDestGetTargetListMethodInfo
ResolveSimpleLabelMethod "dragDestGetTrackMotion" o = Gtk.Widget.WidgetDragDestGetTrackMotionMethodInfo
ResolveSimpleLabelMethod "dragDestSet" o = Gtk.Widget.WidgetDragDestSetMethodInfo
ResolveSimpleLabelMethod "dragDestSetProxy" o = Gtk.Widget.WidgetDragDestSetProxyMethodInfo
ResolveSimpleLabelMethod "dragDestSetTargetList" o = Gtk.Widget.WidgetDragDestSetTargetListMethodInfo
ResolveSimpleLabelMethod "dragDestSetTrackMotion" o = Gtk.Widget.WidgetDragDestSetTrackMotionMethodInfo
ResolveSimpleLabelMethod "dragDestUnset" o = Gtk.Widget.WidgetDragDestUnsetMethodInfo
ResolveSimpleLabelMethod "dragGetData" o = Gtk.Widget.WidgetDragGetDataMethodInfo
ResolveSimpleLabelMethod "dragHighlight" o = Gtk.Widget.WidgetDragHighlightMethodInfo
ResolveSimpleLabelMethod "dragSourceAddImageTargets" o = Gtk.Widget.WidgetDragSourceAddImageTargetsMethodInfo
ResolveSimpleLabelMethod "dragSourceAddTextTargets" o = Gtk.Widget.WidgetDragSourceAddTextTargetsMethodInfo
ResolveSimpleLabelMethod "dragSourceAddUriTargets" o = Gtk.Widget.WidgetDragSourceAddUriTargetsMethodInfo
ResolveSimpleLabelMethod "dragSourceGetTargetList" o = Gtk.Widget.WidgetDragSourceGetTargetListMethodInfo
ResolveSimpleLabelMethod "dragSourceSet" o = Gtk.Widget.WidgetDragSourceSetMethodInfo
ResolveSimpleLabelMethod "dragSourceSetIconGicon" o = Gtk.Widget.WidgetDragSourceSetIconGiconMethodInfo
ResolveSimpleLabelMethod "dragSourceSetIconName" o = Gtk.Widget.WidgetDragSourceSetIconNameMethodInfo
ResolveSimpleLabelMethod "dragSourceSetIconPixbuf" o = Gtk.Widget.WidgetDragSourceSetIconPixbufMethodInfo
ResolveSimpleLabelMethod "dragSourceSetIconStock" o = Gtk.Widget.WidgetDragSourceSetIconStockMethodInfo
ResolveSimpleLabelMethod "dragSourceSetTargetList" o = Gtk.Widget.WidgetDragSourceSetTargetListMethodInfo
ResolveSimpleLabelMethod "dragSourceUnset" o = Gtk.Widget.WidgetDragSourceUnsetMethodInfo
ResolveSimpleLabelMethod "dragUnhighlight" o = Gtk.Widget.WidgetDragUnhighlightMethodInfo
ResolveSimpleLabelMethod "draw" o = Gtk.Widget.WidgetDrawMethodInfo
ResolveSimpleLabelMethod "ensureStyle" o = Gtk.Widget.WidgetEnsureStyleMethodInfo
ResolveSimpleLabelMethod "errorBell" o = Gtk.Widget.WidgetErrorBellMethodInfo
ResolveSimpleLabelMethod "event" o = Gtk.Widget.WidgetEventMethodInfo
ResolveSimpleLabelMethod "forceFloating" o = GObject.Object.ObjectForceFloatingMethodInfo
ResolveSimpleLabelMethod "freezeChildNotify" o = Gtk.Widget.WidgetFreezeChildNotifyMethodInfo
ResolveSimpleLabelMethod "freezeNotify" o = GObject.Object.ObjectFreezeNotifyMethodInfo
ResolveSimpleLabelMethod "getv" o = GObject.Object.ObjectGetvMethodInfo
ResolveSimpleLabelMethod "grabAdd" o = Gtk.Widget.WidgetGrabAddMethodInfo
ResolveSimpleLabelMethod "grabDefault" o = Gtk.Widget.WidgetGrabDefaultMethodInfo
ResolveSimpleLabelMethod "grabFocus" o = Gtk.Widget.WidgetGrabFocusMethodInfo
ResolveSimpleLabelMethod "grabRemove" o = Gtk.Widget.WidgetGrabRemoveMethodInfo
ResolveSimpleLabelMethod "hasDefault" o = Gtk.Widget.WidgetHasDefaultMethodInfo
ResolveSimpleLabelMethod "hasFocus" o = Gtk.Widget.WidgetHasFocusMethodInfo
ResolveSimpleLabelMethod "hasGrab" o = Gtk.Widget.WidgetHasGrabMethodInfo
ResolveSimpleLabelMethod "hasRcStyle" o = Gtk.Widget.WidgetHasRcStyleMethodInfo
ResolveSimpleLabelMethod "hasScreen" o = Gtk.Widget.WidgetHasScreenMethodInfo
ResolveSimpleLabelMethod "hasVisibleFocus" o = Gtk.Widget.WidgetHasVisibleFocusMethodInfo
ResolveSimpleLabelMethod "hide" o = Gtk.Widget.WidgetHideMethodInfo
ResolveSimpleLabelMethod "hideOnDelete" o = Gtk.Widget.WidgetHideOnDeleteMethodInfo
ResolveSimpleLabelMethod "inDestruction" o = Gtk.Widget.WidgetInDestructionMethodInfo
ResolveSimpleLabelMethod "initTemplate" o = Gtk.Widget.WidgetInitTemplateMethodInfo
ResolveSimpleLabelMethod "inputShapeCombineRegion" o = Gtk.Widget.WidgetInputShapeCombineRegionMethodInfo
ResolveSimpleLabelMethod "insertActionGroup" o = Gtk.Widget.WidgetInsertActionGroupMethodInfo
ResolveSimpleLabelMethod "intersect" o = Gtk.Widget.WidgetIntersectMethodInfo
ResolveSimpleLabelMethod "isAncestor" o = Gtk.Widget.WidgetIsAncestorMethodInfo
ResolveSimpleLabelMethod "isComposited" o = Gtk.Widget.WidgetIsCompositedMethodInfo
ResolveSimpleLabelMethod "isDrawable" o = Gtk.Widget.WidgetIsDrawableMethodInfo
ResolveSimpleLabelMethod "isFloating" o = GObject.Object.ObjectIsFloatingMethodInfo
ResolveSimpleLabelMethod "isFocus" o = Gtk.Widget.WidgetIsFocusMethodInfo
ResolveSimpleLabelMethod "isSensitive" o = Gtk.Widget.WidgetIsSensitiveMethodInfo
ResolveSimpleLabelMethod "isToplevel" o = Gtk.Widget.WidgetIsToplevelMethodInfo
ResolveSimpleLabelMethod "isVisible" o = Gtk.Widget.WidgetIsVisibleMethodInfo
ResolveSimpleLabelMethod "keynavFailed" o = Gtk.Widget.WidgetKeynavFailedMethodInfo
ResolveSimpleLabelMethod "listAccelClosures" o = Gtk.Widget.WidgetListAccelClosuresMethodInfo
ResolveSimpleLabelMethod "listActionPrefixes" o = Gtk.Widget.WidgetListActionPrefixesMethodInfo
ResolveSimpleLabelMethod "listMnemonicLabels" o = Gtk.Widget.WidgetListMnemonicLabelsMethodInfo
ResolveSimpleLabelMethod "map" o = Gtk.Widget.WidgetMapMethodInfo
ResolveSimpleLabelMethod "mnemonicActivate" o = Gtk.Widget.WidgetMnemonicActivateMethodInfo
ResolveSimpleLabelMethod "modifyBase" o = Gtk.Widget.WidgetModifyBaseMethodInfo
ResolveSimpleLabelMethod "modifyBg" o = Gtk.Widget.WidgetModifyBgMethodInfo
ResolveSimpleLabelMethod "modifyCursor" o = Gtk.Widget.WidgetModifyCursorMethodInfo
ResolveSimpleLabelMethod "modifyFg" o = Gtk.Widget.WidgetModifyFgMethodInfo
ResolveSimpleLabelMethod "modifyFont" o = Gtk.Widget.WidgetModifyFontMethodInfo
ResolveSimpleLabelMethod "modifyStyle" o = Gtk.Widget.WidgetModifyStyleMethodInfo
ResolveSimpleLabelMethod "modifyText" o = Gtk.Widget.WidgetModifyTextMethodInfo
ResolveSimpleLabelMethod "notify" o = GObject.Object.ObjectNotifyMethodInfo
ResolveSimpleLabelMethod "notifyByPspec" o = GObject.Object.ObjectNotifyByPspecMethodInfo
ResolveSimpleLabelMethod "overrideBackgroundColor" o = Gtk.Widget.WidgetOverrideBackgroundColorMethodInfo
ResolveSimpleLabelMethod "overrideColor" o = Gtk.Widget.WidgetOverrideColorMethodInfo
ResolveSimpleLabelMethod "overrideCursor" o = Gtk.Widget.WidgetOverrideCursorMethodInfo
ResolveSimpleLabelMethod "overrideFont" o = Gtk.Widget.WidgetOverrideFontMethodInfo
ResolveSimpleLabelMethod "overrideSymbolicColor" o = Gtk.Widget.WidgetOverrideSymbolicColorMethodInfo
ResolveSimpleLabelMethod "parserFinished" o = Gtk.Buildable.BuildableParserFinishedMethodInfo
ResolveSimpleLabelMethod "path" o = Gtk.Widget.WidgetPathMethodInfo
ResolveSimpleLabelMethod "queueAllocate" o = Gtk.Widget.WidgetQueueAllocateMethodInfo
ResolveSimpleLabelMethod "queueComputeExpand" o = Gtk.Widget.WidgetQueueComputeExpandMethodInfo
ResolveSimpleLabelMethod "queueDraw" o = Gtk.Widget.WidgetQueueDrawMethodInfo
ResolveSimpleLabelMethod "queueDrawArea" o = Gtk.Widget.WidgetQueueDrawAreaMethodInfo
ResolveSimpleLabelMethod "queueDrawRegion" o = Gtk.Widget.WidgetQueueDrawRegionMethodInfo
ResolveSimpleLabelMethod "queueResize" o = Gtk.Widget.WidgetQueueResizeMethodInfo
ResolveSimpleLabelMethod "queueResizeNoRedraw" o = Gtk.Widget.WidgetQueueResizeNoRedrawMethodInfo
ResolveSimpleLabelMethod "realize" o = Gtk.Widget.WidgetRealizeMethodInfo
ResolveSimpleLabelMethod "ref" o = GObject.Object.ObjectRefMethodInfo
ResolveSimpleLabelMethod "refSink" o = GObject.Object.ObjectRefSinkMethodInfo
ResolveSimpleLabelMethod "regionIntersect" o = Gtk.Widget.WidgetRegionIntersectMethodInfo
ResolveSimpleLabelMethod "registerWindow" o = Gtk.Widget.WidgetRegisterWindowMethodInfo
ResolveSimpleLabelMethod "removeAccelerator" o = Gtk.Widget.WidgetRemoveAcceleratorMethodInfo
ResolveSimpleLabelMethod "removeMnemonicLabel" o = Gtk.Widget.WidgetRemoveMnemonicLabelMethodInfo
ResolveSimpleLabelMethod "removeTickCallback" o = Gtk.Widget.WidgetRemoveTickCallbackMethodInfo
ResolveSimpleLabelMethod "renderIcon" o = Gtk.Widget.WidgetRenderIconMethodInfo
ResolveSimpleLabelMethod "renderIconPixbuf" o = Gtk.Widget.WidgetRenderIconPixbufMethodInfo
ResolveSimpleLabelMethod "reparent" o = Gtk.Widget.WidgetReparentMethodInfo
ResolveSimpleLabelMethod "resetRcStyles" o = Gtk.Widget.WidgetResetRcStylesMethodInfo
ResolveSimpleLabelMethod "resetStyle" o = Gtk.Widget.WidgetResetStyleMethodInfo
ResolveSimpleLabelMethod "runDispose" o = GObject.Object.ObjectRunDisposeMethodInfo
ResolveSimpleLabelMethod "sendExpose" o = Gtk.Widget.WidgetSendExposeMethodInfo
ResolveSimpleLabelMethod "sendFocusChange" o = Gtk.Widget.WidgetSendFocusChangeMethodInfo
ResolveSimpleLabelMethod "shapeCombineRegion" o = Gtk.Widget.WidgetShapeCombineRegionMethodInfo
ResolveSimpleLabelMethod "show" o = Gtk.Widget.WidgetShowMethodInfo
ResolveSimpleLabelMethod "showAll" o = Gtk.Widget.WidgetShowAllMethodInfo
ResolveSimpleLabelMethod "showNow" o = Gtk.Widget.WidgetShowNowMethodInfo
ResolveSimpleLabelMethod "sizeAllocate" o = Gtk.Widget.WidgetSizeAllocateMethodInfo
ResolveSimpleLabelMethod "sizeAllocateWithBaseline" o = Gtk.Widget.WidgetSizeAllocateWithBaselineMethodInfo
ResolveSimpleLabelMethod "sizeRequest" o = Gtk.Widget.WidgetSizeRequestMethodInfo
ResolveSimpleLabelMethod "stealData" o = GObject.Object.ObjectStealDataMethodInfo
ResolveSimpleLabelMethod "stealQdata" o = GObject.Object.ObjectStealQdataMethodInfo
ResolveSimpleLabelMethod "styleAttach" o = Gtk.Widget.WidgetStyleAttachMethodInfo
ResolveSimpleLabelMethod "styleGetProperty" o = Gtk.Widget.WidgetStyleGetPropertyMethodInfo
ResolveSimpleLabelMethod "thawChildNotify" o = Gtk.Widget.WidgetThawChildNotifyMethodInfo
ResolveSimpleLabelMethod "thawNotify" o = GObject.Object.ObjectThawNotifyMethodInfo
ResolveSimpleLabelMethod "translateCoordinates" o = Gtk.Widget.WidgetTranslateCoordinatesMethodInfo
ResolveSimpleLabelMethod "triggerTooltipQuery" o = Gtk.Widget.WidgetTriggerTooltipQueryMethodInfo
ResolveSimpleLabelMethod "unmap" o = Gtk.Widget.WidgetUnmapMethodInfo
ResolveSimpleLabelMethod "unparent" o = Gtk.Widget.WidgetUnparentMethodInfo
ResolveSimpleLabelMethod "unrealize" o = Gtk.Widget.WidgetUnrealizeMethodInfo
ResolveSimpleLabelMethod "unref" o = GObject.Object.ObjectUnrefMethodInfo
ResolveSimpleLabelMethod "unregisterWindow" o = Gtk.Widget.WidgetUnregisterWindowMethodInfo
ResolveSimpleLabelMethod "unsetStateFlags" o = Gtk.Widget.WidgetUnsetStateFlagsMethodInfo
ResolveSimpleLabelMethod "watchClosure" o = GObject.Object.ObjectWatchClosureMethodInfo
ResolveSimpleLabelMethod "getAccessible" o = Gtk.Widget.WidgetGetAccessibleMethodInfo
ResolveSimpleLabelMethod "getActionGroup" o = Gtk.Widget.WidgetGetActionGroupMethodInfo
ResolveSimpleLabelMethod "getAllocatedBaseline" o = Gtk.Widget.WidgetGetAllocatedBaselineMethodInfo
ResolveSimpleLabelMethod "getAllocatedHeight" o = Gtk.Widget.WidgetGetAllocatedHeightMethodInfo
ResolveSimpleLabelMethod "getAllocatedSize" o = Gtk.Widget.WidgetGetAllocatedSizeMethodInfo
ResolveSimpleLabelMethod "getAllocatedWidth" o = Gtk.Widget.WidgetGetAllocatedWidthMethodInfo
ResolveSimpleLabelMethod "getAllocation" o = Gtk.Widget.WidgetGetAllocationMethodInfo
ResolveSimpleLabelMethod "getAncestor" o = Gtk.Widget.WidgetGetAncestorMethodInfo
ResolveSimpleLabelMethod "getAppPaintable" o = Gtk.Widget.WidgetGetAppPaintableMethodInfo
ResolveSimpleLabelMethod "getCanDefault" o = Gtk.Widget.WidgetGetCanDefaultMethodInfo
ResolveSimpleLabelMethod "getCanFocus" o = Gtk.Widget.WidgetGetCanFocusMethodInfo
ResolveSimpleLabelMethod "getChildRequisition" o = Gtk.Widget.WidgetGetChildRequisitionMethodInfo
ResolveSimpleLabelMethod "getChildVisible" o = Gtk.Widget.WidgetGetChildVisibleMethodInfo
ResolveSimpleLabelMethod "getClip" o = Gtk.Widget.WidgetGetClipMethodInfo
ResolveSimpleLabelMethod "getClipboard" o = Gtk.Widget.WidgetGetClipboardMethodInfo
ResolveSimpleLabelMethod "getCompositeName" o = Gtk.Widget.WidgetGetCompositeNameMethodInfo
ResolveSimpleLabelMethod "getData" o = GObject.Object.ObjectGetDataMethodInfo
ResolveSimpleLabelMethod "getDeviceEnabled" o = Gtk.Widget.WidgetGetDeviceEnabledMethodInfo
ResolveSimpleLabelMethod "getDeviceEvents" o = Gtk.Widget.WidgetGetDeviceEventsMethodInfo
ResolveSimpleLabelMethod "getDirection" o = Gtk.Widget.WidgetGetDirectionMethodInfo
ResolveSimpleLabelMethod "getDisplay" o = Gtk.Widget.WidgetGetDisplayMethodInfo
ResolveSimpleLabelMethod "getDoubleBuffered" o = Gtk.Widget.WidgetGetDoubleBufferedMethodInfo
ResolveSimpleLabelMethod "getEvents" o = Gtk.Widget.WidgetGetEventsMethodInfo
ResolveSimpleLabelMethod "getFocusOnClick" o = Gtk.Widget.WidgetGetFocusOnClickMethodInfo
ResolveSimpleLabelMethod "getFontMap" o = Gtk.Widget.WidgetGetFontMapMethodInfo
ResolveSimpleLabelMethod "getFontOptions" o = Gtk.Widget.WidgetGetFontOptionsMethodInfo
ResolveSimpleLabelMethod "getFrameClock" o = Gtk.Widget.WidgetGetFrameClockMethodInfo
ResolveSimpleLabelMethod "getHalign" o = Gtk.Widget.WidgetGetHalignMethodInfo
ResolveSimpleLabelMethod "getHasTooltip" o = Gtk.Widget.WidgetGetHasTooltipMethodInfo
ResolveSimpleLabelMethod "getHasWindow" o = Gtk.Widget.WidgetGetHasWindowMethodInfo
ResolveSimpleLabelMethod "getHexpand" o = Gtk.Widget.WidgetGetHexpandMethodInfo
ResolveSimpleLabelMethod "getHexpandSet" o = Gtk.Widget.WidgetGetHexpandSetMethodInfo
ResolveSimpleLabelMethod "getInternalChild" o = Gtk.Buildable.BuildableGetInternalChildMethodInfo
ResolveSimpleLabelMethod "getLabel" o = SimpleLabelGetLabelMethodInfo
ResolveSimpleLabelMethod "getMapped" o = Gtk.Widget.WidgetGetMappedMethodInfo
ResolveSimpleLabelMethod "getMarginBottom" o = Gtk.Widget.WidgetGetMarginBottomMethodInfo
ResolveSimpleLabelMethod "getMarginEnd" o = Gtk.Widget.WidgetGetMarginEndMethodInfo
ResolveSimpleLabelMethod "getMarginLeft" o = Gtk.Widget.WidgetGetMarginLeftMethodInfo
ResolveSimpleLabelMethod "getMarginRight" o = Gtk.Widget.WidgetGetMarginRightMethodInfo
ResolveSimpleLabelMethod "getMarginStart" o = Gtk.Widget.WidgetGetMarginStartMethodInfo
ResolveSimpleLabelMethod "getMarginTop" o = Gtk.Widget.WidgetGetMarginTopMethodInfo
ResolveSimpleLabelMethod "getModifierMask" o = Gtk.Widget.WidgetGetModifierMaskMethodInfo
ResolveSimpleLabelMethod "getModifierStyle" o = Gtk.Widget.WidgetGetModifierStyleMethodInfo
ResolveSimpleLabelMethod "getName" o = Gtk.Widget.WidgetGetNameMethodInfo
ResolveSimpleLabelMethod "getNoShowAll" o = Gtk.Widget.WidgetGetNoShowAllMethodInfo
ResolveSimpleLabelMethod "getOpacity" o = Gtk.Widget.WidgetGetOpacityMethodInfo
ResolveSimpleLabelMethod "getPangoContext" o = Gtk.Widget.WidgetGetPangoContextMethodInfo
ResolveSimpleLabelMethod "getParent" o = Gtk.Widget.WidgetGetParentMethodInfo
ResolveSimpleLabelMethod "getParentWindow" o = Gtk.Widget.WidgetGetParentWindowMethodInfo
ResolveSimpleLabelMethod "getPath" o = Gtk.Widget.WidgetGetPathMethodInfo
ResolveSimpleLabelMethod "getPointer" o = Gtk.Widget.WidgetGetPointerMethodInfo
ResolveSimpleLabelMethod "getPreferredHeight" o = Gtk.Widget.WidgetGetPreferredHeightMethodInfo
ResolveSimpleLabelMethod "getPreferredHeightAndBaselineForWidth" o = Gtk.Widget.WidgetGetPreferredHeightAndBaselineForWidthMethodInfo
ResolveSimpleLabelMethod "getPreferredHeightForWidth" o = Gtk.Widget.WidgetGetPreferredHeightForWidthMethodInfo
ResolveSimpleLabelMethod "getPreferredSize" o = Gtk.Widget.WidgetGetPreferredSizeMethodInfo
ResolveSimpleLabelMethod "getPreferredWidth" o = Gtk.Widget.WidgetGetPreferredWidthMethodInfo
ResolveSimpleLabelMethod "getPreferredWidthForHeight" o = Gtk.Widget.WidgetGetPreferredWidthForHeightMethodInfo
ResolveSimpleLabelMethod "getProperty" o = GObject.Object.ObjectGetPropertyMethodInfo
ResolveSimpleLabelMethod "getQdata" o = GObject.Object.ObjectGetQdataMethodInfo
ResolveSimpleLabelMethod "getRealized" o = Gtk.Widget.WidgetGetRealizedMethodInfo
ResolveSimpleLabelMethod "getReceivesDefault" o = Gtk.Widget.WidgetGetReceivesDefaultMethodInfo
ResolveSimpleLabelMethod "getRequestMode" o = Gtk.Widget.WidgetGetRequestModeMethodInfo
ResolveSimpleLabelMethod "getRequisition" o = Gtk.Widget.WidgetGetRequisitionMethodInfo
ResolveSimpleLabelMethod "getRootWindow" o = Gtk.Widget.WidgetGetRootWindowMethodInfo
ResolveSimpleLabelMethod "getScaleFactor" o = Gtk.Widget.WidgetGetScaleFactorMethodInfo
ResolveSimpleLabelMethod "getScreen" o = Gtk.Widget.WidgetGetScreenMethodInfo
ResolveSimpleLabelMethod "getSensitive" o = Gtk.Widget.WidgetGetSensitiveMethodInfo
ResolveSimpleLabelMethod "getSettings" o = Gtk.Widget.WidgetGetSettingsMethodInfo
ResolveSimpleLabelMethod "getSizeRequest" o = Gtk.Widget.WidgetGetSizeRequestMethodInfo
ResolveSimpleLabelMethod "getState" o = Gtk.Widget.WidgetGetStateMethodInfo
ResolveSimpleLabelMethod "getStateFlags" o = Gtk.Widget.WidgetGetStateFlagsMethodInfo
ResolveSimpleLabelMethod "getStyle" o = Gtk.Widget.WidgetGetStyleMethodInfo
ResolveSimpleLabelMethod "getStyleContext" o = Gtk.Widget.WidgetGetStyleContextMethodInfo
ResolveSimpleLabelMethod "getSupportMultidevice" o = Gtk.Widget.WidgetGetSupportMultideviceMethodInfo
ResolveSimpleLabelMethod "getTemplateChild" o = Gtk.Widget.WidgetGetTemplateChildMethodInfo
ResolveSimpleLabelMethod "getTooltipMarkup" o = Gtk.Widget.WidgetGetTooltipMarkupMethodInfo
ResolveSimpleLabelMethod "getTooltipText" o = Gtk.Widget.WidgetGetTooltipTextMethodInfo
ResolveSimpleLabelMethod "getTooltipWindow" o = Gtk.Widget.WidgetGetTooltipWindowMethodInfo
ResolveSimpleLabelMethod "getToplevel" o = Gtk.Widget.WidgetGetToplevelMethodInfo
ResolveSimpleLabelMethod "getValign" o = Gtk.Widget.WidgetGetValignMethodInfo
ResolveSimpleLabelMethod "getValignWithBaseline" o = Gtk.Widget.WidgetGetValignWithBaselineMethodInfo
ResolveSimpleLabelMethod "getVexpand" o = Gtk.Widget.WidgetGetVexpandMethodInfo
ResolveSimpleLabelMethod "getVexpandSet" o = Gtk.Widget.WidgetGetVexpandSetMethodInfo
ResolveSimpleLabelMethod "getVisible" o = Gtk.Widget.WidgetGetVisibleMethodInfo
ResolveSimpleLabelMethod "getVisual" o = Gtk.Widget.WidgetGetVisualMethodInfo
ResolveSimpleLabelMethod "getWidthChars" o = SimpleLabelGetWidthCharsMethodInfo
ResolveSimpleLabelMethod "getWindow" o = Gtk.Widget.WidgetGetWindowMethodInfo
ResolveSimpleLabelMethod "getXalign" o = SimpleLabelGetXalignMethodInfo
ResolveSimpleLabelMethod "setAccelPath" o = Gtk.Widget.WidgetSetAccelPathMethodInfo
ResolveSimpleLabelMethod "setAllocation" o = Gtk.Widget.WidgetSetAllocationMethodInfo
ResolveSimpleLabelMethod "setAppPaintable" o = Gtk.Widget.WidgetSetAppPaintableMethodInfo
ResolveSimpleLabelMethod "setBuildableProperty" o = Gtk.Buildable.BuildableSetBuildablePropertyMethodInfo
ResolveSimpleLabelMethod "setCanDefault" o = Gtk.Widget.WidgetSetCanDefaultMethodInfo
ResolveSimpleLabelMethod "setCanFocus" o = Gtk.Widget.WidgetSetCanFocusMethodInfo
ResolveSimpleLabelMethod "setChildVisible" o = Gtk.Widget.WidgetSetChildVisibleMethodInfo
ResolveSimpleLabelMethod "setClip" o = Gtk.Widget.WidgetSetClipMethodInfo
ResolveSimpleLabelMethod "setCompositeName" o = Gtk.Widget.WidgetSetCompositeNameMethodInfo
ResolveSimpleLabelMethod "setData" o = GObject.Object.ObjectSetDataMethodInfo
ResolveSimpleLabelMethod "setDataFull" o = GObject.Object.ObjectSetDataFullMethodInfo
ResolveSimpleLabelMethod "setDeviceEnabled" o = Gtk.Widget.WidgetSetDeviceEnabledMethodInfo
ResolveSimpleLabelMethod "setDeviceEvents" o = Gtk.Widget.WidgetSetDeviceEventsMethodInfo
ResolveSimpleLabelMethod "setDirection" o = Gtk.Widget.WidgetSetDirectionMethodInfo
ResolveSimpleLabelMethod "setDoubleBuffered" o = Gtk.Widget.WidgetSetDoubleBufferedMethodInfo
ResolveSimpleLabelMethod "setEvents" o = Gtk.Widget.WidgetSetEventsMethodInfo
ResolveSimpleLabelMethod "setFocusOnClick" o = Gtk.Widget.WidgetSetFocusOnClickMethodInfo
ResolveSimpleLabelMethod "setFontMap" o = Gtk.Widget.WidgetSetFontMapMethodInfo
ResolveSimpleLabelMethod "setFontOptions" o = Gtk.Widget.WidgetSetFontOptionsMethodInfo
ResolveSimpleLabelMethod "setHalign" o = Gtk.Widget.WidgetSetHalignMethodInfo
ResolveSimpleLabelMethod "setHasTooltip" o = Gtk.Widget.WidgetSetHasTooltipMethodInfo
ResolveSimpleLabelMethod "setHasWindow" o = Gtk.Widget.WidgetSetHasWindowMethodInfo
ResolveSimpleLabelMethod "setHexpand" o = Gtk.Widget.WidgetSetHexpandMethodInfo
ResolveSimpleLabelMethod "setHexpandSet" o = Gtk.Widget.WidgetSetHexpandSetMethodInfo
ResolveSimpleLabelMethod "setLabel" o = SimpleLabelSetLabelMethodInfo
ResolveSimpleLabelMethod "setMapped" o = Gtk.Widget.WidgetSetMappedMethodInfo
ResolveSimpleLabelMethod "setMarginBottom" o = Gtk.Widget.WidgetSetMarginBottomMethodInfo
ResolveSimpleLabelMethod "setMarginEnd" o = Gtk.Widget.WidgetSetMarginEndMethodInfo
ResolveSimpleLabelMethod "setMarginLeft" o = Gtk.Widget.WidgetSetMarginLeftMethodInfo
ResolveSimpleLabelMethod "setMarginRight" o = Gtk.Widget.WidgetSetMarginRightMethodInfo
ResolveSimpleLabelMethod "setMarginStart" o = Gtk.Widget.WidgetSetMarginStartMethodInfo
ResolveSimpleLabelMethod "setMarginTop" o = Gtk.Widget.WidgetSetMarginTopMethodInfo
ResolveSimpleLabelMethod "setName" o = Gtk.Widget.WidgetSetNameMethodInfo
ResolveSimpleLabelMethod "setNoShowAll" o = Gtk.Widget.WidgetSetNoShowAllMethodInfo
ResolveSimpleLabelMethod "setOpacity" o = Gtk.Widget.WidgetSetOpacityMethodInfo
ResolveSimpleLabelMethod "setParent" o = Gtk.Widget.WidgetSetParentMethodInfo
ResolveSimpleLabelMethod "setParentWindow" o = Gtk.Widget.WidgetSetParentWindowMethodInfo
ResolveSimpleLabelMethod "setProperty" o = GObject.Object.ObjectSetPropertyMethodInfo
ResolveSimpleLabelMethod "setRealized" o = Gtk.Widget.WidgetSetRealizedMethodInfo
ResolveSimpleLabelMethod "setReceivesDefault" o = Gtk.Widget.WidgetSetReceivesDefaultMethodInfo
ResolveSimpleLabelMethod "setRedrawOnAllocate" o = Gtk.Widget.WidgetSetRedrawOnAllocateMethodInfo
ResolveSimpleLabelMethod "setSensitive" o = Gtk.Widget.WidgetSetSensitiveMethodInfo
ResolveSimpleLabelMethod "setSizeRequest" o = Gtk.Widget.WidgetSetSizeRequestMethodInfo
ResolveSimpleLabelMethod "setState" o = Gtk.Widget.WidgetSetStateMethodInfo
ResolveSimpleLabelMethod "setStateFlags" o = Gtk.Widget.WidgetSetStateFlagsMethodInfo
ResolveSimpleLabelMethod "setStyle" o = Gtk.Widget.WidgetSetStyleMethodInfo
ResolveSimpleLabelMethod "setSupportMultidevice" o = Gtk.Widget.WidgetSetSupportMultideviceMethodInfo
ResolveSimpleLabelMethod "setTooltipMarkup" o = Gtk.Widget.WidgetSetTooltipMarkupMethodInfo
ResolveSimpleLabelMethod "setTooltipText" o = Gtk.Widget.WidgetSetTooltipTextMethodInfo
ResolveSimpleLabelMethod "setTooltipWindow" o = Gtk.Widget.WidgetSetTooltipWindowMethodInfo
ResolveSimpleLabelMethod "setValign" o = Gtk.Widget.WidgetSetValignMethodInfo
ResolveSimpleLabelMethod "setVexpand" o = Gtk.Widget.WidgetSetVexpandMethodInfo
ResolveSimpleLabelMethod "setVexpandSet" o = Gtk.Widget.WidgetSetVexpandSetMethodInfo
ResolveSimpleLabelMethod "setVisible" o = Gtk.Widget.WidgetSetVisibleMethodInfo
ResolveSimpleLabelMethod "setVisual" o = Gtk.Widget.WidgetSetVisualMethodInfo
ResolveSimpleLabelMethod "setWidthChars" o = SimpleLabelSetWidthCharsMethodInfo
ResolveSimpleLabelMethod "setWindow" o = Gtk.Widget.WidgetSetWindowMethodInfo
ResolveSimpleLabelMethod "setXalign" o = SimpleLabelSetXalignMethodInfo
ResolveSimpleLabelMethod l o = O.MethodResolutionFailed l o
instance (info ~ ResolveSimpleLabelMethod t SimpleLabel, O.OverloadedMethod info SimpleLabel p) => OL.IsLabel t (SimpleLabel -> 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 ~ ResolveSimpleLabelMethod t SimpleLabel, O.OverloadedMethod info SimpleLabel p, R.HasField t SimpleLabel p) => R.HasField t SimpleLabel p where
getField = O.overloadedMethod @info
#endif
instance (info ~ ResolveSimpleLabelMethod t SimpleLabel, O.OverloadedMethodInfo info SimpleLabel) => OL.IsLabel t (O.MethodProxy info SimpleLabel) where
#if MIN_VERSION_base(4,10,0)
fromLabel = O.MethodProxy
#else
fromLabel _ = O.MethodProxy
#endif
#endif
getSimpleLabelLabel :: (MonadIO m, IsSimpleLabel o) => o -> m T.Text
getSimpleLabelLabel :: forall (m :: * -> *) o. (MonadIO m, IsSimpleLabel o) => o -> m Text
getSimpleLabelLabel 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
"getSimpleLabelLabel" (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
"label"
setSimpleLabelLabel :: (MonadIO m, IsSimpleLabel o) => o -> T.Text -> m ()
setSimpleLabelLabel :: forall (m :: * -> *) o.
(MonadIO m, IsSimpleLabel o) =>
o -> Text -> m ()
setSimpleLabelLabel 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
"label" (Text -> Maybe Text
forall a. a -> Maybe a
Just Text
val)
constructSimpleLabelLabel :: (IsSimpleLabel o, MIO.MonadIO m) => T.Text -> m (GValueConstruct o)
constructSimpleLabelLabel :: forall o (m :: * -> *).
(IsSimpleLabel o, MonadIO m) =>
Text -> m (GValueConstruct o)
constructSimpleLabelLabel 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
"label" (Text -> Maybe Text
forall a. a -> Maybe a
P.Just Text
val)
#if defined(ENABLE_OVERLOADING)
data SimpleLabelLabelPropertyInfo
instance AttrInfo SimpleLabelLabelPropertyInfo where
type AttrAllowedOps SimpleLabelLabelPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
type AttrBaseTypeConstraint SimpleLabelLabelPropertyInfo = IsSimpleLabel
type AttrSetTypeConstraint SimpleLabelLabelPropertyInfo = (~) T.Text
type AttrTransferTypeConstraint SimpleLabelLabelPropertyInfo = (~) T.Text
type AttrTransferType SimpleLabelLabelPropertyInfo = T.Text
type AttrGetType SimpleLabelLabelPropertyInfo = T.Text
type AttrLabel SimpleLabelLabelPropertyInfo = "label"
type AttrOrigin SimpleLabelLabelPropertyInfo = SimpleLabel
attrGet = getSimpleLabelLabel
attrSet = setSimpleLabelLabel
attrTransfer _ v = do
return v
attrConstruct = constructSimpleLabelLabel
attrClear = undefined
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.SimpleLabel.label"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-SimpleLabel.html#g:attr:label"
})
#endif
getSimpleLabelWidthChars :: (MonadIO m, IsSimpleLabel o) => o -> m Int32
getSimpleLabelWidthChars :: forall (m :: * -> *) o.
(MonadIO m, IsSimpleLabel o) =>
o -> m Int32
getSimpleLabelWidthChars o
obj = IO Int32 -> m Int32
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO Int32 -> m Int32) -> IO Int32 -> m Int32
forall a b. (a -> b) -> a -> b
$ o -> String -> IO Int32
forall a. GObject a => a -> String -> IO Int32
B.Properties.getObjectPropertyInt32 o
obj String
"width-chars"
setSimpleLabelWidthChars :: (MonadIO m, IsSimpleLabel o) => o -> Int32 -> m ()
setSimpleLabelWidthChars :: forall (m :: * -> *) o.
(MonadIO m, IsSimpleLabel o) =>
o -> Int32 -> m ()
setSimpleLabelWidthChars o
obj Int32
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 -> Int32 -> IO ()
forall a. GObject a => a -> String -> Int32 -> IO ()
B.Properties.setObjectPropertyInt32 o
obj String
"width-chars" Int32
val
constructSimpleLabelWidthChars :: (IsSimpleLabel o, MIO.MonadIO m) => Int32 -> m (GValueConstruct o)
constructSimpleLabelWidthChars :: forall o (m :: * -> *).
(IsSimpleLabel o, MonadIO m) =>
Int32 -> m (GValueConstruct o)
constructSimpleLabelWidthChars Int32
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 -> Int32 -> IO (GValueConstruct o)
forall o. String -> Int32 -> IO (GValueConstruct o)
B.Properties.constructObjectPropertyInt32 String
"width-chars" Int32
val
#if defined(ENABLE_OVERLOADING)
data SimpleLabelWidthCharsPropertyInfo
instance AttrInfo SimpleLabelWidthCharsPropertyInfo where
type AttrAllowedOps SimpleLabelWidthCharsPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
type AttrBaseTypeConstraint SimpleLabelWidthCharsPropertyInfo = IsSimpleLabel
type AttrSetTypeConstraint SimpleLabelWidthCharsPropertyInfo = (~) Int32
type AttrTransferTypeConstraint SimpleLabelWidthCharsPropertyInfo = (~) Int32
type AttrTransferType SimpleLabelWidthCharsPropertyInfo = Int32
type AttrGetType SimpleLabelWidthCharsPropertyInfo = Int32
type AttrLabel SimpleLabelWidthCharsPropertyInfo = "width-chars"
type AttrOrigin SimpleLabelWidthCharsPropertyInfo = SimpleLabel
attrGet = getSimpleLabelWidthChars
attrSet = setSimpleLabelWidthChars
attrTransfer _ v = do
return v
attrConstruct = constructSimpleLabelWidthChars
attrClear = undefined
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.SimpleLabel.widthChars"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-SimpleLabel.html#g:attr:widthChars"
})
#endif
getSimpleLabelXalign :: (MonadIO m, IsSimpleLabel o) => o -> m Float
getSimpleLabelXalign :: forall (m :: * -> *) o.
(MonadIO m, IsSimpleLabel o) =>
o -> m Float
getSimpleLabelXalign o
obj = IO Float -> m Float
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
MIO.liftIO (IO Float -> m Float) -> IO Float -> m Float
forall a b. (a -> b) -> a -> b
$ o -> String -> IO Float
forall a. GObject a => a -> String -> IO Float
B.Properties.getObjectPropertyFloat o
obj String
"xalign"
setSimpleLabelXalign :: (MonadIO m, IsSimpleLabel o) => o -> Float -> m ()
setSimpleLabelXalign :: forall (m :: * -> *) o.
(MonadIO m, IsSimpleLabel o) =>
o -> Float -> m ()
setSimpleLabelXalign o
obj Float
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 -> Float -> IO ()
forall a. GObject a => a -> String -> Float -> IO ()
B.Properties.setObjectPropertyFloat o
obj String
"xalign" Float
val
constructSimpleLabelXalign :: (IsSimpleLabel o, MIO.MonadIO m) => Float -> m (GValueConstruct o)
constructSimpleLabelXalign :: forall o (m :: * -> *).
(IsSimpleLabel o, MonadIO m) =>
Float -> m (GValueConstruct o)
constructSimpleLabelXalign Float
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 -> Float -> IO (GValueConstruct o)
forall o. String -> Float -> IO (GValueConstruct o)
B.Properties.constructObjectPropertyFloat String
"xalign" Float
val
#if defined(ENABLE_OVERLOADING)
data SimpleLabelXalignPropertyInfo
instance AttrInfo SimpleLabelXalignPropertyInfo where
type AttrAllowedOps SimpleLabelXalignPropertyInfo = '[ 'AttrSet, 'AttrConstruct, 'AttrGet]
type AttrBaseTypeConstraint SimpleLabelXalignPropertyInfo = IsSimpleLabel
type AttrSetTypeConstraint SimpleLabelXalignPropertyInfo = (~) Float
type AttrTransferTypeConstraint SimpleLabelXalignPropertyInfo = (~) Float
type AttrTransferType SimpleLabelXalignPropertyInfo = Float
type AttrGetType SimpleLabelXalignPropertyInfo = Float
type AttrLabel SimpleLabelXalignPropertyInfo = "xalign"
type AttrOrigin SimpleLabelXalignPropertyInfo = SimpleLabel
attrGet = getSimpleLabelXalign
attrSet = setSimpleLabelXalign
attrTransfer _ v = do
return v
attrConstruct = constructSimpleLabelXalign
attrClear = undefined
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.SimpleLabel.xalign"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-SimpleLabel.html#g:attr:xalign"
})
#endif
#if defined(ENABLE_OVERLOADING)
instance O.HasAttributeList SimpleLabel
type instance O.AttributeList SimpleLabel = SimpleLabelAttributeList
type SimpleLabelAttributeList = ('[ '("appPaintable", Gtk.Widget.WidgetAppPaintablePropertyInfo), '("canDefault", Gtk.Widget.WidgetCanDefaultPropertyInfo), '("canFocus", Gtk.Widget.WidgetCanFocusPropertyInfo), '("compositeChild", Gtk.Widget.WidgetCompositeChildPropertyInfo), '("doubleBuffered", Gtk.Widget.WidgetDoubleBufferedPropertyInfo), '("events", Gtk.Widget.WidgetEventsPropertyInfo), '("expand", Gtk.Widget.WidgetExpandPropertyInfo), '("focusOnClick", Gtk.Widget.WidgetFocusOnClickPropertyInfo), '("halign", Gtk.Widget.WidgetHalignPropertyInfo), '("hasDefault", Gtk.Widget.WidgetHasDefaultPropertyInfo), '("hasFocus", Gtk.Widget.WidgetHasFocusPropertyInfo), '("hasTooltip", Gtk.Widget.WidgetHasTooltipPropertyInfo), '("heightRequest", Gtk.Widget.WidgetHeightRequestPropertyInfo), '("hexpand", Gtk.Widget.WidgetHexpandPropertyInfo), '("hexpandSet", Gtk.Widget.WidgetHexpandSetPropertyInfo), '("isFocus", Gtk.Widget.WidgetIsFocusPropertyInfo), '("label", SimpleLabelLabelPropertyInfo), '("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), '("receivesDefault", Gtk.Widget.WidgetReceivesDefaultPropertyInfo), '("scaleFactor", Gtk.Widget.WidgetScaleFactorPropertyInfo), '("sensitive", Gtk.Widget.WidgetSensitivePropertyInfo), '("style", Gtk.Widget.WidgetStylePropertyInfo), '("tooltipMarkup", Gtk.Widget.WidgetTooltipMarkupPropertyInfo), '("tooltipText", Gtk.Widget.WidgetTooltipTextPropertyInfo), '("valign", Gtk.Widget.WidgetValignPropertyInfo), '("vexpand", Gtk.Widget.WidgetVexpandPropertyInfo), '("vexpandSet", Gtk.Widget.WidgetVexpandSetPropertyInfo), '("visible", Gtk.Widget.WidgetVisiblePropertyInfo), '("widthChars", SimpleLabelWidthCharsPropertyInfo), '("widthRequest", Gtk.Widget.WidgetWidthRequestPropertyInfo), '("window", Gtk.Widget.WidgetWindowPropertyInfo), '("xalign", SimpleLabelXalignPropertyInfo)] :: [(Symbol, DK.Type)])
#endif
#if defined(ENABLE_OVERLOADING)
simpleLabelLabel :: AttrLabelProxy "label"
simpleLabelLabel = AttrLabelProxy
simpleLabelWidthChars :: AttrLabelProxy "widthChars"
simpleLabelWidthChars = AttrLabelProxy
simpleLabelXalign :: AttrLabelProxy "xalign"
simpleLabelXalign = AttrLabelProxy
#endif
#if defined(ENABLE_OVERLOADING)
type instance O.SignalList SimpleLabel = SimpleLabelSignalList
type SimpleLabelSignalList = ('[ '("accelClosuresChanged", Gtk.Widget.WidgetAccelClosuresChangedSignalInfo), '("buttonPressEvent", Gtk.Widget.WidgetButtonPressEventSignalInfo), '("buttonReleaseEvent", Gtk.Widget.WidgetButtonReleaseEventSignalInfo), '("canActivateAccel", Gtk.Widget.WidgetCanActivateAccelSignalInfo), '("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), '("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), '("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_simple_label_new" dzl_simple_label_new ::
CString ->
IO (Ptr SimpleLabel)
simpleLabelNew ::
(B.CallStack.HasCallStack, MonadIO m) =>
T.Text
-> m SimpleLabel
simpleLabelNew :: forall (m :: * -> *).
(HasCallStack, MonadIO m) =>
Text -> m SimpleLabel
simpleLabelNew Text
label = IO SimpleLabel -> m SimpleLabel
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO SimpleLabel -> m SimpleLabel)
-> IO SimpleLabel -> m SimpleLabel
forall a b. (a -> b) -> a -> b
$ do
CString
label' <- Text -> IO CString
textToCString Text
label
Ptr SimpleLabel
result <- CString -> IO (Ptr SimpleLabel)
dzl_simple_label_new CString
label'
Text -> Ptr SimpleLabel -> IO ()
forall a. HasCallStack => Text -> Ptr a -> IO ()
checkUnexpectedReturnNULL Text
"simpleLabelNew" Ptr SimpleLabel
result
SimpleLabel
result' <- ((ManagedPtr SimpleLabel -> SimpleLabel)
-> Ptr SimpleLabel -> IO SimpleLabel
forall a b.
(HasCallStack, GObject a, GObject b) =>
(ManagedPtr a -> a) -> Ptr b -> IO a
newObject ManagedPtr SimpleLabel -> SimpleLabel
SimpleLabel) Ptr SimpleLabel
result
CString -> IO ()
forall a. Ptr a -> IO ()
freeMem CString
label'
SimpleLabel -> IO SimpleLabel
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return SimpleLabel
result'
#if defined(ENABLE_OVERLOADING)
#endif
foreign import ccall "dzl_simple_label_get_label" dzl_simple_label_get_label ::
Ptr SimpleLabel ->
IO CString
simpleLabelGetLabel ::
(B.CallStack.HasCallStack, MonadIO m, IsSimpleLabel a) =>
a
-> m T.Text
simpleLabelGetLabel :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsSimpleLabel a) =>
a -> m Text
simpleLabelGetLabel 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 SimpleLabel
self' <- a -> IO (Ptr SimpleLabel)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
CString
result <- Ptr SimpleLabel -> IO CString
dzl_simple_label_get_label Ptr SimpleLabel
self'
Text -> CString -> IO ()
forall a. HasCallStack => Text -> Ptr a -> IO ()
checkUnexpectedReturnNULL Text
"simpleLabelGetLabel" 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 SimpleLabelGetLabelMethodInfo
instance (signature ~ (m T.Text), MonadIO m, IsSimpleLabel a) => O.OverloadedMethod SimpleLabelGetLabelMethodInfo a signature where
overloadedMethod = simpleLabelGetLabel
instance O.OverloadedMethodInfo SimpleLabelGetLabelMethodInfo a where
overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.SimpleLabel.simpleLabelGetLabel",
O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-SimpleLabel.html#v:simpleLabelGetLabel"
})
#endif
foreign import ccall "dzl_simple_label_get_width_chars" dzl_simple_label_get_width_chars ::
Ptr SimpleLabel ->
IO Int32
simpleLabelGetWidthChars ::
(B.CallStack.HasCallStack, MonadIO m, IsSimpleLabel a) =>
a
-> m Int32
simpleLabelGetWidthChars :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsSimpleLabel a) =>
a -> m Int32
simpleLabelGetWidthChars a
self = IO Int32 -> m Int32
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO Int32 -> m Int32) -> IO Int32 -> m Int32
forall a b. (a -> b) -> a -> b
$ do
Ptr SimpleLabel
self' <- a -> IO (Ptr SimpleLabel)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
Int32
result <- Ptr SimpleLabel -> IO Int32
dzl_simple_label_get_width_chars Ptr SimpleLabel
self'
a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
self
Int32 -> IO Int32
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return Int32
result
#if defined(ENABLE_OVERLOADING)
data SimpleLabelGetWidthCharsMethodInfo
instance (signature ~ (m Int32), MonadIO m, IsSimpleLabel a) => O.OverloadedMethod SimpleLabelGetWidthCharsMethodInfo a signature where
overloadedMethod = simpleLabelGetWidthChars
instance O.OverloadedMethodInfo SimpleLabelGetWidthCharsMethodInfo a where
overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.SimpleLabel.simpleLabelGetWidthChars",
O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-SimpleLabel.html#v:simpleLabelGetWidthChars"
})
#endif
foreign import ccall "dzl_simple_label_get_xalign" dzl_simple_label_get_xalign ::
Ptr SimpleLabel ->
IO CFloat
simpleLabelGetXalign ::
(B.CallStack.HasCallStack, MonadIO m, IsSimpleLabel a) =>
a
-> m Float
simpleLabelGetXalign :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsSimpleLabel a) =>
a -> m Float
simpleLabelGetXalign a
self = IO Float -> m Float
forall a. IO a -> m a
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO Float -> m Float) -> IO Float -> m Float
forall a b. (a -> b) -> a -> b
$ do
Ptr SimpleLabel
self' <- a -> IO (Ptr SimpleLabel)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
CFloat
result <- Ptr SimpleLabel -> IO CFloat
dzl_simple_label_get_xalign Ptr SimpleLabel
self'
let result' :: Float
result' = CFloat -> Float
forall a b. (Real a, Fractional b) => a -> b
realToFrac CFloat
result
a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
self
Float -> IO Float
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return Float
result'
#if defined(ENABLE_OVERLOADING)
data SimpleLabelGetXalignMethodInfo
instance (signature ~ (m Float), MonadIO m, IsSimpleLabel a) => O.OverloadedMethod SimpleLabelGetXalignMethodInfo a signature where
overloadedMethod = simpleLabelGetXalign
instance O.OverloadedMethodInfo SimpleLabelGetXalignMethodInfo a where
overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.SimpleLabel.simpleLabelGetXalign",
O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-SimpleLabel.html#v:simpleLabelGetXalign"
})
#endif
foreign import ccall "dzl_simple_label_set_label" dzl_simple_label_set_label ::
Ptr SimpleLabel ->
CString ->
IO ()
simpleLabelSetLabel ::
(B.CallStack.HasCallStack, MonadIO m, IsSimpleLabel a) =>
a
-> T.Text
-> m ()
simpleLabelSetLabel :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsSimpleLabel a) =>
a -> Text -> m ()
simpleLabelSetLabel a
self Text
label = 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 SimpleLabel
self' <- a -> IO (Ptr SimpleLabel)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
CString
label' <- Text -> IO CString
textToCString Text
label
Ptr SimpleLabel -> CString -> IO ()
dzl_simple_label_set_label Ptr SimpleLabel
self' CString
label'
a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
self
CString -> IO ()
forall a. Ptr a -> IO ()
freeMem CString
label'
() -> IO ()
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return ()
#if defined(ENABLE_OVERLOADING)
data SimpleLabelSetLabelMethodInfo
instance (signature ~ (T.Text -> m ()), MonadIO m, IsSimpleLabel a) => O.OverloadedMethod SimpleLabelSetLabelMethodInfo a signature where
overloadedMethod = simpleLabelSetLabel
instance O.OverloadedMethodInfo SimpleLabelSetLabelMethodInfo a where
overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.SimpleLabel.simpleLabelSetLabel",
O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-SimpleLabel.html#v:simpleLabelSetLabel"
})
#endif
foreign import ccall "dzl_simple_label_set_width_chars" dzl_simple_label_set_width_chars ::
Ptr SimpleLabel ->
Int32 ->
IO ()
simpleLabelSetWidthChars ::
(B.CallStack.HasCallStack, MonadIO m, IsSimpleLabel a) =>
a
-> Int32
-> m ()
simpleLabelSetWidthChars :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsSimpleLabel a) =>
a -> Int32 -> m ()
simpleLabelSetWidthChars a
self Int32
widthChars = 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 SimpleLabel
self' <- a -> IO (Ptr SimpleLabel)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
Ptr SimpleLabel -> Int32 -> IO ()
dzl_simple_label_set_width_chars Ptr SimpleLabel
self' Int32
widthChars
a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
self
() -> IO ()
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return ()
#if defined(ENABLE_OVERLOADING)
data SimpleLabelSetWidthCharsMethodInfo
instance (signature ~ (Int32 -> m ()), MonadIO m, IsSimpleLabel a) => O.OverloadedMethod SimpleLabelSetWidthCharsMethodInfo a signature where
overloadedMethod = simpleLabelSetWidthChars
instance O.OverloadedMethodInfo SimpleLabelSetWidthCharsMethodInfo a where
overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.SimpleLabel.simpleLabelSetWidthChars",
O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-SimpleLabel.html#v:simpleLabelSetWidthChars"
})
#endif
foreign import ccall "dzl_simple_label_set_xalign" dzl_simple_label_set_xalign ::
Ptr SimpleLabel ->
CFloat ->
IO ()
simpleLabelSetXalign ::
(B.CallStack.HasCallStack, MonadIO m, IsSimpleLabel a) =>
a
-> Float
-> m ()
simpleLabelSetXalign :: forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsSimpleLabel a) =>
a -> Float -> m ()
simpleLabelSetXalign a
self Float
xalign = 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 SimpleLabel
self' <- a -> IO (Ptr SimpleLabel)
forall a b. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr b)
unsafeManagedPtrCastPtr a
self
let xalign' :: CFloat
xalign' = Float -> CFloat
forall a b. (Real a, Fractional b) => a -> b
realToFrac Float
xalign
Ptr SimpleLabel -> CFloat -> IO ()
dzl_simple_label_set_xalign Ptr SimpleLabel
self' CFloat
xalign'
a -> IO ()
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr a
self
() -> IO ()
forall a. a -> IO a
forall (m :: * -> *) a. Monad m => a -> m a
return ()
#if defined(ENABLE_OVERLOADING)
data SimpleLabelSetXalignMethodInfo
instance (signature ~ (Float -> m ()), MonadIO m, IsSimpleLabel a) => O.OverloadedMethod SimpleLabelSetXalignMethodInfo a signature where
overloadedMethod = simpleLabelSetXalign
instance O.OverloadedMethodInfo SimpleLabelSetXalignMethodInfo a where
overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.Dazzle.Objects.SimpleLabel.simpleLabelSetXalign",
O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-dazzle-1.0.2/docs/GI-Dazzle-Objects-SimpleLabel.html#v:simpleLabelSetXalign"
})
#endif