module HROOT.Graf.TGraphPolar.Interface where
import Data.Word
import Foreign.C
import Foreign.Ptr
import Foreign.ForeignPtr
import FFICXX.Runtime.Cast
import HROOT.Graf.TGraphPolar.RawType
import HROOT.Hist.TGraphErrors.Interface
class (ITGraphErrors a) => ITGraphPolar a where
instance Existable TGraphPolar where
data Exist TGraphPolar = forall a. (FPtr a, ITGraphPolar a) => ETGraphPolar a
upcastTGraphPolar :: (FPtr a, ITGraphPolar a) => a -> TGraphPolar
upcastTGraphPolar h = let fh = get_fptr h
fh2 :: ForeignPtr RawTGraphPolar = castForeignPtr fh
in cast_fptr_to_obj fh2
downcastTGraphPolar :: (FPtr a, ITGraphPolar a) => TGraphPolar -> a
downcastTGraphPolar h = let fh = get_fptr h
fh2 = castForeignPtr fh
in cast_fptr_to_obj fh2