{-# LANGUAGE TypeApplications #-}
#if (MIN_VERSION_haskell_gi_overloading(1,0,0) && !defined(__HADDOCK_VERSION__))
#define ENABLE_OVERLOADING
#endif
module GI.Atk.Objects.Util
(
Util(..) ,
IsUtil ,
toUtil ,
#if defined(ENABLE_OVERLOADING)
ResolveUtilMethod ,
#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.GClosure as B.GClosure
import qualified Data.GI.Base.GError as B.GError
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.Text as T
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 GI.GObject.Objects.Object as GObject.Object
newtype Util = Util (SP.ManagedPtr Util)
deriving (Util -> Util -> Bool
(Util -> Util -> Bool) -> (Util -> Util -> Bool) -> Eq Util
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: Util -> Util -> Bool
$c/= :: Util -> Util -> Bool
== :: Util -> Util -> Bool
$c== :: Util -> Util -> Bool
Eq)
instance SP.ManagedPtrNewtype Util where
toManagedPtr :: Util -> ManagedPtr Util
toManagedPtr (Util ManagedPtr Util
p) = ManagedPtr Util
p
foreign import ccall "atk_util_get_type"
c_atk_util_get_type :: IO B.Types.GType
instance B.Types.TypedObject Util where
glibType :: IO GType
glibType = IO GType
c_atk_util_get_type
instance B.Types.GObject Util
instance B.GValue.IsGValue Util where
toGValue :: Util -> IO GValue
toGValue Util
o = do
GType
gtype <- IO GType
c_atk_util_get_type
Util -> (Ptr Util -> IO GValue) -> IO GValue
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
B.ManagedPtr.withManagedPtr Util
o (GType -> (GValue -> Ptr Util -> IO ()) -> Ptr Util -> IO GValue
forall a. GType -> (GValue -> a -> IO ()) -> a -> IO GValue
B.GValue.buildGValue GType
gtype GValue -> Ptr Util -> IO ()
forall a. GObject a => GValue -> Ptr a -> IO ()
B.GValue.set_object)
fromGValue :: GValue -> IO Util
fromGValue GValue
gv = do
Ptr Util
ptr <- GValue -> IO (Ptr Util)
forall b. GObject b => GValue -> IO (Ptr b)
B.GValue.get_object GValue
gv :: IO (Ptr Util)
(ManagedPtr Util -> Util) -> Ptr Util -> IO Util
forall a b.
(HasCallStack, GObject a, GObject b) =>
(ManagedPtr a -> a) -> Ptr b -> IO a
B.ManagedPtr.newObject ManagedPtr Util -> Util
Util Ptr Util
ptr
class (SP.GObject o, O.IsDescendantOf Util o) => IsUtil o
instance (SP.GObject o, O.IsDescendantOf Util o) => IsUtil o
instance O.HasParentTypes Util
type instance O.ParentTypes Util = '[GObject.Object.Object]
toUtil :: (MonadIO m, IsUtil o) => o -> m Util
toUtil :: o -> m Util
toUtil = IO Util -> m Util
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO Util -> m Util) -> (o -> IO Util) -> o -> m Util
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (ManagedPtr Util -> Util) -> o -> IO Util
forall o o'.
(HasCallStack, ManagedPtrNewtype o, TypedObject o,
ManagedPtrNewtype o', TypedObject o') =>
(ManagedPtr o' -> o') -> o -> IO o'
unsafeCastTo ManagedPtr Util -> Util
Util
#if defined(ENABLE_OVERLOADING)
type family ResolveUtilMethod (t :: Symbol) (o :: *) :: * where
ResolveUtilMethod "bindProperty" o = GObject.Object.ObjectBindPropertyMethodInfo
ResolveUtilMethod "bindPropertyFull" o = GObject.Object.ObjectBindPropertyFullMethodInfo
ResolveUtilMethod "forceFloating" o = GObject.Object.ObjectForceFloatingMethodInfo
ResolveUtilMethod "freezeNotify" o = GObject.Object.ObjectFreezeNotifyMethodInfo
ResolveUtilMethod "getv" o = GObject.Object.ObjectGetvMethodInfo
ResolveUtilMethod "isFloating" o = GObject.Object.ObjectIsFloatingMethodInfo
ResolveUtilMethod "notify" o = GObject.Object.ObjectNotifyMethodInfo
ResolveUtilMethod "notifyByPspec" o = GObject.Object.ObjectNotifyByPspecMethodInfo
ResolveUtilMethod "ref" o = GObject.Object.ObjectRefMethodInfo
ResolveUtilMethod "refSink" o = GObject.Object.ObjectRefSinkMethodInfo
ResolveUtilMethod "runDispose" o = GObject.Object.ObjectRunDisposeMethodInfo
ResolveUtilMethod "stealData" o = GObject.Object.ObjectStealDataMethodInfo
ResolveUtilMethod "stealQdata" o = GObject.Object.ObjectStealQdataMethodInfo
ResolveUtilMethod "thawNotify" o = GObject.Object.ObjectThawNotifyMethodInfo
ResolveUtilMethod "unref" o = GObject.Object.ObjectUnrefMethodInfo
ResolveUtilMethod "watchClosure" o = GObject.Object.ObjectWatchClosureMethodInfo
ResolveUtilMethod "getData" o = GObject.Object.ObjectGetDataMethodInfo
ResolveUtilMethod "getProperty" o = GObject.Object.ObjectGetPropertyMethodInfo
ResolveUtilMethod "getQdata" o = GObject.Object.ObjectGetQdataMethodInfo
ResolveUtilMethod "setData" o = GObject.Object.ObjectSetDataMethodInfo
ResolveUtilMethod "setDataFull" o = GObject.Object.ObjectSetDataFullMethodInfo
ResolveUtilMethod "setProperty" o = GObject.Object.ObjectSetPropertyMethodInfo
ResolveUtilMethod l o = O.MethodResolutionFailed l o
instance (info ~ ResolveUtilMethod t Util, O.MethodInfo info Util p) => OL.IsLabel t (Util -> p) where
#if MIN_VERSION_base(4,10,0)
fromLabel = O.overloadedMethod @info
#else
fromLabel _ = O.overloadedMethod @info
#endif
#endif
#if defined(ENABLE_OVERLOADING)
instance O.HasAttributeList Util
type instance O.AttributeList Util = UtilAttributeList
type UtilAttributeList = ('[ ] :: [(Symbol, *)])
#endif
#if defined(ENABLE_OVERLOADING)
#endif
#if defined(ENABLE_OVERLOADING)
type instance O.SignalList Util = UtilSignalList
type UtilSignalList = ('[ '("notify", GObject.Object.ObjectNotifySignalInfo)] :: [(Symbol, *)])
#endif