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