{-# LANGUAGE ForeignFunctionInterface, TypeFamilies,
  MultiParamTypeClasses, FlexibleInstances, TypeSynonymInstances,
  EmptyDataDecls, ExistentialQuantification, ScopedTypeVariables #-}
module HROOT.IO.TFile.RawType where
import Foreign.Ptr
import FFICXX.Runtime.Cast

data RawTFile

newtype TFile = TFile (Ptr RawTFile)
                  deriving (TFile -> TFile -> Bool
(TFile -> TFile -> Bool) -> (TFile -> TFile -> Bool) -> Eq TFile
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
$c== :: TFile -> TFile -> Bool
== :: TFile -> TFile -> Bool
$c/= :: TFile -> TFile -> Bool
/= :: TFile -> TFile -> Bool
Eq, Eq TFile
Eq TFile
-> (TFile -> TFile -> Ordering)
-> (TFile -> TFile -> Bool)
-> (TFile -> TFile -> Bool)
-> (TFile -> TFile -> Bool)
-> (TFile -> TFile -> Bool)
-> (TFile -> TFile -> TFile)
-> (TFile -> TFile -> TFile)
-> Ord TFile
TFile -> TFile -> Bool
TFile -> TFile -> Ordering
TFile -> TFile -> TFile
forall a.
Eq a
-> (a -> a -> Ordering)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> Bool)
-> (a -> a -> a)
-> (a -> a -> a)
-> Ord a
$ccompare :: TFile -> TFile -> Ordering
compare :: TFile -> TFile -> Ordering
$c< :: TFile -> TFile -> Bool
< :: TFile -> TFile -> Bool
$c<= :: TFile -> TFile -> Bool
<= :: TFile -> TFile -> Bool
$c> :: TFile -> TFile -> Bool
> :: TFile -> TFile -> Bool
$c>= :: TFile -> TFile -> Bool
>= :: TFile -> TFile -> Bool
$cmax :: TFile -> TFile -> TFile
max :: TFile -> TFile -> TFile
$cmin :: TFile -> TFile -> TFile
min :: TFile -> TFile -> TFile
Ord, Int -> TFile -> ShowS
[TFile] -> ShowS
TFile -> String
(Int -> TFile -> ShowS)
-> (TFile -> String) -> ([TFile] -> ShowS) -> Show TFile
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> TFile -> ShowS
showsPrec :: Int -> TFile -> ShowS
$cshow :: TFile -> String
show :: TFile -> String
$cshowList :: [TFile] -> ShowS
showList :: [TFile] -> ShowS
Show)

instance () => FPtr (TFile) where
        type Raw TFile = RawTFile
        get_fptr :: TFile -> Ptr (Raw TFile)
get_fptr (TFile Ptr RawTFile
ptr) = Ptr (Raw TFile)
Ptr RawTFile
ptr
        cast_fptr_to_obj :: Ptr (Raw TFile) -> TFile
cast_fptr_to_obj = Ptr (Raw TFile) -> TFile
Ptr RawTFile -> TFile
TFile