{-# LINE 1 "src/Stopgap/Graphics/UI/Gdk/Window.hsc" #-} {-# OPTIONS_GHC -Wall -fno-warn-tabs #-} module Stopgap.Graphics.UI.Gdk.Window where import Foreign.Ptr data WTag newtype W = W (Ptr WTag) deriving Int -> W -> ShowS [W] -> ShowS W -> String (Int -> W -> ShowS) -> (W -> String) -> ([W] -> ShowS) -> Show W forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a $cshowsPrec :: Int -> W -> ShowS showsPrec :: Int -> W -> ShowS $cshow :: W -> String show :: W -> String $cshowList :: [W] -> ShowS showList :: [W] -> ShowS Show destroy :: W -> IO () destroy :: W -> IO () destroy = W -> IO () c_gdk_window_destroy foreign import ccall "gdk_window_destroy" c_gdk_window_destroy :: W -> IO ()