HROOT-hist-0.10.0.3: Haskell binding to ROOT Hist modules
Safe HaskellSafe-Inferred
LanguageHaskell2010

HROOT.Hist.TGraphErrors.RawType

Documentation

data RawTGraphErrors Source #

Instances

Instances details
Castable TGraphErrors (Ptr RawTGraphErrors) Source # 
Instance details

Defined in HROOT.Hist.TGraphErrors.Cast

Methods

cast :: TGraphErrors -> (Ptr RawTGraphErrors -> IO r) -> IO r #

uncast :: Ptr RawTGraphErrors -> (TGraphErrors -> IO r) -> IO r #

(ITGraphErrors a, FPtr a) => Castable a (Ptr RawTGraphErrors) Source # 
Instance details

Defined in HROOT.Hist.TGraphErrors.Cast

Methods

cast :: a -> (Ptr RawTGraphErrors -> IO r) -> IO r #

uncast :: Ptr RawTGraphErrors -> (a -> IO r) -> IO r #

newtype TGraphErrors Source #

Instances

Instances details
ITAttFill TGraphErrors 
Instance details

Defined in HROOT.Hist.TGraphErrors.Implementation

ITAttLine TGraphErrors 
Instance details

Defined in HROOT.Hist.TGraphErrors.Implementation

ITAttMarker TGraphErrors 
Instance details

Defined in HROOT.Hist.TGraphErrors.Implementation

ITNamed TGraphErrors 
Instance details

Defined in HROOT.Hist.TGraphErrors.Implementation

Methods

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

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

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

ITObject TGraphErrors 
Instance details

Defined in HROOT.Hist.TGraphErrors.Implementation

Methods

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

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

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

getName :: TGraphErrors -> IO CString

isA :: TGraphErrors -> IO TClass

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

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

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

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

write_ :: TGraphErrors -> IO CInt

ITGraph TGraphErrors Source # 
Instance details

Defined in HROOT.Hist.TGraphErrors.Implementation

Methods

apply :: (ITF1 c0, FPtr c0) => TGraphErrors -> c0 -> IO () Source #

chisquare :: (ITF1 c0, FPtr c0) => TGraphErrors -> c0 -> IO CDouble Source #

drawGraph :: Castable c0 CString => TGraphErrors -> CInt -> Ptr CDouble -> Ptr CDouble -> c0 -> IO () Source #

drawPanelTGraph :: TGraphErrors -> IO () Source #

expand :: TGraphErrors -> CInt -> CInt -> IO () Source #

fitPanelTGraph :: TGraphErrors -> IO () Source #

getCorrelationFactorTGraph :: TGraphErrors -> IO CDouble Source #

getCovarianceTGraph :: TGraphErrors -> IO CDouble Source #

getMeanTGraph :: TGraphErrors -> CInt -> IO CDouble Source #

getRMSTGraph :: TGraphErrors -> CInt -> IO CDouble Source #

getErrorX :: TGraphErrors -> CInt -> IO CDouble Source #

getErrorY :: TGraphErrors -> CInt -> IO CDouble Source #

getErrorXhigh :: TGraphErrors -> CInt -> IO CDouble Source #

getErrorXlow :: TGraphErrors -> CInt -> IO CDouble Source #

getErrorYhigh :: TGraphErrors -> CInt -> IO CDouble Source #

getErrorYlow :: TGraphErrors -> CInt -> IO CDouble Source #

initExpo :: TGraphErrors -> CDouble -> CDouble -> IO () Source #

initGaus :: TGraphErrors -> CDouble -> CDouble -> IO () Source #

initPolynom :: TGraphErrors -> CDouble -> CDouble -> IO () Source #

insertPoint :: TGraphErrors -> IO CInt Source #

integralTGraph :: TGraphErrors -> CInt -> CInt -> IO CDouble Source #

isEditable :: TGraphErrors -> IO CBool Source #

isInsideTGraph :: TGraphErrors -> CDouble -> CDouble -> IO CInt Source #

leastSquareFit :: TGraphErrors -> CInt -> Ptr CDouble -> CDouble -> CDouble -> IO () Source #

paintStats :: (ITF1 c0, FPtr c0) => TGraphErrors -> c0 -> IO () Source #

removePoint :: TGraphErrors -> CInt -> IO CInt Source #

setEditable :: TGraphErrors -> CBool -> IO () Source #

setHistogram :: (ITH1F c0, FPtr c0) => TGraphErrors -> c0 -> IO () Source #

setMaximumTGraph :: TGraphErrors -> CDouble -> IO () Source #

setMinimumTGraph :: TGraphErrors -> CDouble -> IO () Source #

set :: TGraphErrors -> CInt -> IO () Source #

setPoint :: TGraphErrors -> CInt -> CDouble -> CDouble -> IO () Source #

ITGraphErrors TGraphErrors Source # 
Instance details

Defined in HROOT.Hist.TGraphErrors.Implementation

Show TGraphErrors Source # 
Instance details

Defined in HROOT.Hist.TGraphErrors.RawType

FPtr TGraphErrors Source # 
Instance details

Defined in HROOT.Hist.TGraphErrors.RawType

Associated Types

type Raw TGraphErrors #

Eq TGraphErrors Source # 
Instance details

Defined in HROOT.Hist.TGraphErrors.RawType

Ord TGraphErrors Source # 
Instance details

Defined in HROOT.Hist.TGraphErrors.RawType

IDeletable TGraphErrors Source # 
Instance details

Defined in HROOT.Hist.TGraphErrors.Implementation

Methods

delete :: TGraphErrors -> IO () #

Castable TGraphErrors (Ptr RawTGraphErrors) Source # 
Instance details

Defined in HROOT.Hist.TGraphErrors.Cast

Methods

cast :: TGraphErrors -> (Ptr RawTGraphErrors -> IO r) -> IO r #

uncast :: Ptr RawTGraphErrors -> (TGraphErrors -> IO r) -> IO r #

type Raw TGraphErrors Source # 
Instance details

Defined in HROOT.Hist.TGraphErrors.RawType