{-# LINE 1 "lib/Data/GI/CodeGen/GType.hsc" #-}
module Data.GI.CodeGen.GType
( GType
, gtypeIsA
, gtypeIsBoxed
) where
import Foreign.C
import System.IO.Unsafe (unsafePerformIO)
import Data.GI.Base.BasicTypes (CGType, GType(..))
foreign import ccall unsafe "g_type_is_a" g_type_is_a ::
CGType -> CGType -> IO CInt
gtypeIsA :: GType -> GType -> Bool
gtypeIsA (GType gtype) (GType is_a) = (/= 0) $
unsafePerformIO $ g_type_is_a gtype is_a
gtypeBoxed :: GType
gtypeBoxed = GType 72
{-# LINE 22 "lib/Data/GI/CodeGen/GType.hsc" #-}
gtypeIsBoxed :: GType -> Bool
gtypeIsBoxed gtype = gtypeIsA gtype gtypeBoxed