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

HROOT.Core.TKey

Documentation

newtype TKey Source #

Constructors

TKey (Ptr RawTKey) 

Instances

Instances details
ITKey TKey Source # 
Instance details

Defined in HROOT.Core.TKey.Implementation

ITNamed TKey Source # 
Instance details

Defined in HROOT.Core.TKey.Implementation

Methods

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

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

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

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 #

Show TKey Source # 
Instance details

Defined in HROOT.Core.TKey.RawType

Methods

showsPrec :: Int -> TKey -> ShowS #

show :: TKey -> String #

showList :: [TKey] -> ShowS #

FPtr TKey Source # 
Instance details

Defined in HROOT.Core.TKey.RawType

Associated Types

type Raw TKey #

Eq TKey Source # 
Instance details

Defined in HROOT.Core.TKey.RawType

Methods

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

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

Ord TKey Source # 
Instance details

Defined in HROOT.Core.TKey.RawType

Methods

compare :: TKey -> TKey -> Ordering #

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

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

(>) :: TKey -> TKey -> Bool #

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

max :: TKey -> TKey -> TKey #

min :: TKey -> TKey -> TKey #

IDeletable TKey Source # 
Instance details

Defined in HROOT.Core.TKey.Implementation

Methods

delete :: TKey -> IO () #

Castable TKey (Ptr RawTKey) Source # 
Instance details

Defined in HROOT.Core.TKey.Cast

Methods

cast :: TKey -> (Ptr RawTKey -> IO r) -> IO r #

uncast :: Ptr RawTKey -> (TKey -> IO r) -> IO r #

type Raw TKey Source # 
Instance details

Defined in HROOT.Core.TKey.RawType

class ITNamed a => ITKey a Source #

Instances

Instances details
ITKey TKey Source # 
Instance details

Defined in HROOT.Core.TKey.Implementation

upcastTKey :: forall a. (FPtr a, ITKey a) => a -> TKey Source #

downcastTKey :: forall a. (FPtr a, ITKey a) => TKey -> a Source #

newTKey :: (ITDirectory c3, FPtr c3, ITClass c2, FPtr c2, Castable c1 CString, Castable c0 CString) => c0 -> c1 -> c2 -> CInt -> c3 -> IO TKey Source #