module HROOT.Graf.TEllipse.Cast where
import Foreign.Ptr
import Foreign.ForeignPtr (castForeignPtr, newForeignPtr_)
import Foreign.ForeignPtr.Unsafe
import FFICXX.Runtime.Cast
import System.IO.Unsafe
import HROOT.Graf.TEllipse.RawType
import HROOT.Graf.TEllipse.Interface
instance (ITEllipse a, FPtr a) => Castable a (Ptr RawTEllipse) where
cast = unsafeForeignPtrToPtr . castForeignPtr . get_fptr
uncast = cast_fptr_to_obj . castForeignPtr . unsafePerformIO . newForeignPtr_
instance Castable TEllipse (Ptr RawTEllipse) where
cast = unsafeForeignPtrToPtr . castForeignPtr . get_fptr
uncast = cast_fptr_to_obj . castForeignPtr . unsafePerformIO . newForeignPtr_