HROOT-core-0.10.0.3: Haskell binding to ROOT Core modules
Safe HaskellSafe-Inferred
LanguageHaskell2010

HROOT.Core.TObject

Documentation

newtype TObject Source #

Constructors

TObject (Ptr RawTObject) 

Instances

Instances details
ITObject TObject Source # 
Instance details

Defined in HROOT.Core.TObject.Implementation

Show TObject Source # 
Instance details

Defined in HROOT.Core.TObject.RawType

FPtr TObject Source # 
Instance details

Defined in HROOT.Core.TObject.RawType

Associated Types

type Raw TObject #

Eq TObject Source # 
Instance details

Defined in HROOT.Core.TObject.RawType

Methods

(==) :: TObject -> TObject -> Bool #

(/=) :: TObject -> TObject -> Bool #

Ord TObject Source # 
Instance details

Defined in HROOT.Core.TObject.RawType

IDeletable TObject Source # 
Instance details

Defined in HROOT.Core.TObject.Implementation

Methods

delete :: TObject -> IO () #

Castable TObject (Ptr RawTObject) Source # 
Instance details

Defined in HROOT.Core.TObject.Cast

Methods

cast :: TObject -> (Ptr RawTObject -> IO r) -> IO r #

uncast :: Ptr RawTObject -> (TObject -> IO r) -> IO r #

type Raw TObject Source # 
Instance details

Defined in HROOT.Core.TObject.RawType

class IDeletable a => ITObject a where Source #

Methods

clear :: Castable c0 CString => a -> c0 -> IO () Source #

draw :: Castable c0 CString => a -> c0 -> IO () Source #

findObject :: Castable c0 CString => a -> c0 -> IO TObject Source #

getName :: a -> IO CString Source #

isA :: a -> IO TClass Source #

paint :: Castable c0 CString => a -> c0 -> IO () Source #

printObj :: Castable c0 CString => a -> c0 -> IO () Source #

saveAs :: (Castable c1 CString, Castable c0 CString) => a -> c0 -> c1 -> IO () Source #

write :: Castable c0 CString => a -> c0 -> CInt -> CInt -> IO CInt Source #

write_ :: a -> IO CInt Source #

Instances

Instances details
ITObject TApplication Source # 
Instance details

Defined in HROOT.Core.TApplication.Implementation

ITObject TClass Source # 
Instance details

Defined in HROOT.Core.TClass.Implementation

Methods

clear :: Castable c0 CString => TClass -> c0 -> IO () Source #

draw :: Castable c0 CString => TClass -> c0 -> IO () Source #

findObject :: Castable c0 CString => TClass -> c0 -> IO TObject Source #

getName :: TClass -> IO CString Source #

isA :: TClass -> IO TClass Source #

paint :: Castable c0 CString => TClass -> c0 -> IO () Source #

printObj :: Castable c0 CString => TClass -> c0 -> IO () Source #

saveAs :: (Castable c1 CString, Castable c0 CString) => TClass -> c0 -> c1 -> IO () Source #

write :: Castable c0 CString => TClass -> c0 -> CInt -> CInt -> IO CInt Source #

write_ :: TClass -> IO CInt Source #

ITObject TCollection Source # 
Instance details

Defined in HROOT.Core.TCollection.Implementation

ITObject TColor Source # 
Instance details

Defined in HROOT.Core.TColor.Implementation

Methods

clear :: Castable c0 CString => TColor -> c0 -> IO () Source #

draw :: Castable c0 CString => TColor -> c0 -> IO () Source #

findObject :: Castable c0 CString => TColor -> c0 -> IO TObject Source #

getName :: TColor -> IO CString Source #

isA :: TColor -> IO TClass Source #

paint :: Castable c0 CString => TColor -> c0 -> IO () Source #

printObj :: Castable c0 CString => TColor -> c0 -> IO () Source #

saveAs :: (Castable c1 CString, Castable c0 CString) => TColor -> c0 -> c1 -> IO () Source #

write :: Castable c0 CString => TColor -> c0 -> CInt -> CInt -> IO CInt Source #

write_ :: TColor -> IO CInt Source #

ITObject TDirectory Source # 
Instance details

Defined in HROOT.Core.TDirectory.Implementation

ITObject TGlobal Source # 
Instance details

Defined in HROOT.Core.TGlobal.Implementation

ITObject TKey Source # 
Instance details

Defined in HROOT.Core.TKey.Implementation

Methods

clear :: Castable c0 CString => TKey -> c0 -> IO () Source #

draw :: Castable c0 CString => TKey -> c0 -> IO () Source #

findObject :: Castable c0 CString => TKey -> c0 -> IO TObject Source #

getName :: TKey -> IO CString Source #

isA :: TKey -> IO TClass Source #

paint :: Castable c0 CString => TKey -> c0 -> IO () Source #

printObj :: Castable c0 CString => TKey -> c0 -> IO () Source #

saveAs :: (Castable c1 CString, Castable c0 CString) => TKey -> c0 -> c1 -> IO () Source #

write :: Castable c0 CString => TKey -> c0 -> CInt -> CInt -> IO CInt Source #

write_ :: TKey -> IO CInt Source #

ITObject TNamed Source # 
Instance details

Defined in HROOT.Core.TNamed.Implementation

Methods

clear :: Castable c0 CString => TNamed -> c0 -> IO () Source #

draw :: Castable c0 CString => TNamed -> c0 -> IO () Source #

findObject :: Castable c0 CString => TNamed -> c0 -> IO TObject Source #

getName :: TNamed -> IO CString Source #

isA :: TNamed -> IO TClass Source #

paint :: Castable c0 CString => TNamed -> c0 -> IO () Source #

printObj :: Castable c0 CString => TNamed -> c0 -> IO () Source #

saveAs :: (Castable c1 CString, Castable c0 CString) => TNamed -> c0 -> c1 -> IO () Source #

write :: Castable c0 CString => TNamed -> c0 -> CInt -> CInt -> IO CInt Source #

write_ :: TNamed -> IO CInt Source #

ITObject TObjArray Source # 
Instance details

Defined in HROOT.Core.TObjArray.Implementation

ITObject TObject Source # 
Instance details

Defined in HROOT.Core.TObject.Implementation

ITObject TROOT Source # 
Instance details

Defined in HROOT.Core.TROOT.Implementation

Methods

clear :: Castable c0 CString => TROOT -> c0 -> IO () Source #

draw :: Castable c0 CString => TROOT -> c0 -> IO () Source #

findObject :: Castable c0 CString => TROOT -> c0 -> IO TObject Source #

getName :: TROOT -> IO CString Source #

isA :: TROOT -> IO TClass Source #

paint :: Castable c0 CString => TROOT -> c0 -> IO () Source #

printObj :: Castable c0 CString => TROOT -> c0 -> IO () Source #

saveAs :: (Castable c1 CString, Castable c0 CString) => TROOT -> c0 -> c1 -> IO () Source #

write :: Castable c0 CString => TROOT -> c0 -> CInt -> CInt -> IO CInt Source #

write_ :: TROOT -> IO CInt Source #

ITObject TSeqCollection Source # 
Instance details

Defined in HROOT.Core.TSeqCollection.Implementation

ITObject TStyle Source # 
Instance details

Defined in HROOT.Core.TStyle.Implementation

Methods

clear :: Castable c0 CString => TStyle -> c0 -> IO () Source #

draw :: Castable c0 CString => TStyle -> c0 -> IO () Source #

findObject :: Castable c0 CString => TStyle -> c0 -> IO TObject Source #

getName :: TStyle -> IO CString Source #

isA :: TStyle -> IO TClass Source #

paint :: Castable c0 CString => TStyle -> c0 -> IO () Source #

printObj :: Castable c0 CString => TStyle -> c0 -> IO () Source #

saveAs :: (Castable c1 CString, Castable c0 CString) => TStyle -> c0 -> c1 -> IO () Source #

write :: Castable c0 CString => TStyle -> c0 -> CInt -> CInt -> IO CInt Source #

write_ :: TStyle -> IO CInt Source #

ITObject TSystem Source # 
Instance details

Defined in HROOT.Core.TSystem.Implementation

ITObject TVirtualPad Source # 
Instance details

Defined in HROOT.Core.TVirtualPad.Implementation

upcastTObject :: forall a. (FPtr a, ITObject a) => a -> TObject Source #

downcastTObject :: forall a. (FPtr a, ITObject a) => TObject -> a Source #