{-# LINE 1 "src/Stopgap/System/GLib/Object.hsc" #-}
{-# LANGUAGE ImportQualifiedPost #-}
{-# OPTIONS_GHC -Wall -fno-warn-tabs #-}

module Stopgap.System.GLib.Object where

import Foreign.Ptr
import Stopgap.Data.Ptr

data OTag

newtype O = O (Ptr OTag) deriving Int -> O -> ShowS
[O] -> ShowS
O -> String
(Int -> O -> ShowS) -> (O -> String) -> ([O] -> ShowS) -> Show O
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> O -> ShowS
showsPrec :: Int -> O -> ShowS
$cshow :: O -> String
show :: O -> String
$cshowList :: [O] -> ShowS
showList :: [O] -> ShowS
Show

class IsPtr o => IsO o where toO :: o -> O