HROOT-tree-0.10.0.3: Haskell binding to ROOT Tree modules
Safe HaskellSafe-Inferred
LanguageHaskell2010

HROOT.Tree.TTree

Documentation

newtype TTree Source #

Constructors

TTree (Ptr RawTTree) 

Instances

Instances details
ITAttFill TTree 
Instance details

Defined in HROOT.Tree.TTree.Implementation

Methods

setFillColor :: TTree -> CInt -> IO ()

setFillStyle :: TTree -> CInt -> IO ()

ITAttLine TTree 
Instance details

Defined in HROOT.Tree.TTree.Implementation

ITAttMarker TTree 
Instance details

Defined in HROOT.Tree.TTree.Implementation

ITNamed TTree 
Instance details

Defined in HROOT.Tree.TTree.Implementation

Methods

setName :: Castable c0 CString => TTree -> c0 -> IO ()

setNameTitle :: (Castable c1 CString, Castable c0 CString) => TTree -> c0 -> c1 -> IO ()

setTitle :: Castable c0 CString => TTree -> c0 -> IO ()

ITObject TTree 
Instance details

Defined in HROOT.Tree.TTree.Implementation

Methods

clear :: Castable c0 CString => TTree -> c0 -> IO ()

draw :: Castable c0 CString => TTree -> c0 -> IO ()

findObject :: Castable c0 CString => TTree -> c0 -> IO TObject

getName :: TTree -> IO CString

isA :: TTree -> IO TClass

paint :: Castable c0 CString => TTree -> c0 -> IO ()

printObj :: Castable c0 CString => TTree -> c0 -> IO ()

saveAs :: (Castable c1 CString, Castable c0 CString) => TTree -> c0 -> c1 -> IO ()

write :: Castable c0 CString => TTree -> c0 -> CInt -> CInt -> IO CInt

write_ :: TTree -> IO CInt

ITTree TTree Source # 
Instance details

Defined in HROOT.Tree.TTree.Implementation

Methods

branch :: Castable c0 CString => TTree -> c0 -> CInt -> CInt -> IO CInt Source #

branch1 :: (Castable c1 CString, Castable c0 CString) => TTree -> c0 -> Ptr () -> c1 -> CInt -> IO TBranch Source #

fillTree :: TTree -> IO CInt Source #

Show TTree Source # 
Instance details

Defined in HROOT.Tree.TTree.RawType

Methods

showsPrec :: Int -> TTree -> ShowS #

show :: TTree -> String #

showList :: [TTree] -> ShowS #

FPtr TTree Source # 
Instance details

Defined in HROOT.Tree.TTree.RawType

Associated Types

type Raw TTree #

Eq TTree Source # 
Instance details

Defined in HROOT.Tree.TTree.RawType

Methods

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

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

Ord TTree Source # 
Instance details

Defined in HROOT.Tree.TTree.RawType

Methods

compare :: TTree -> TTree -> Ordering #

(<) :: TTree -> TTree -> Bool #

(<=) :: TTree -> TTree -> Bool #

(>) :: TTree -> TTree -> Bool #

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

max :: TTree -> TTree -> TTree #

min :: TTree -> TTree -> TTree #

IDeletable TTree Source # 
Instance details

Defined in HROOT.Tree.TTree.Implementation

Methods

delete :: TTree -> IO () #

Castable TTree (Ptr RawTTree) Source # 
Instance details

Defined in HROOT.Tree.TTree.Cast

Methods

cast :: TTree -> (Ptr RawTTree -> IO r) -> IO r #

uncast :: Ptr RawTTree -> (TTree -> IO r) -> IO r #

type Raw TTree Source # 
Instance details

Defined in HROOT.Tree.TTree.RawType

class (ITNamed a, ITAttLine a, ITAttFill a, ITAttMarker a) => ITTree a where Source #

Methods

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

branch1 :: (Castable c1 CString, Castable c0 CString) => a -> c0 -> Ptr () -> c1 -> CInt -> IO TBranch Source #

fillTree :: a -> IO CInt Source #

Instances

Instances details
ITTree TChain Source # 
Instance details

Defined in HROOT.Tree.TChain.Implementation

Methods

branch :: Castable c0 CString => TChain -> c0 -> CInt -> CInt -> IO CInt Source #

branch1 :: (Castable c1 CString, Castable c0 CString) => TChain -> c0 -> Ptr () -> c1 -> CInt -> IO TBranch Source #

fillTree :: TChain -> IO CInt Source #

ITTree TTree Source # 
Instance details

Defined in HROOT.Tree.TTree.Implementation

Methods

branch :: Castable c0 CString => TTree -> c0 -> CInt -> CInt -> IO CInt Source #

branch1 :: (Castable c1 CString, Castable c0 CString) => TTree -> c0 -> Ptr () -> c1 -> CInt -> IO TBranch Source #

fillTree :: TTree -> IO CInt Source #

upcastTTree :: forall a. (FPtr a, ITTree a) => a -> TTree Source #

downcastTTree :: forall a. (FPtr a, ITTree a) => TTree -> a Source #

newTTree :: (Castable c1 CString, Castable c0 CString) => c0 -> c1 -> CInt -> IO TTree Source #