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