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

HROOT.Hist.TGraphBentErrors.RawType

Documentation

newtype TGraphBentErrors Source #

Instances

Instances details
ITAttFill TGraphBentErrors 
Instance details

Defined in HROOT.Hist.TGraphBentErrors.Implementation

ITAttLine TGraphBentErrors 
Instance details

Defined in HROOT.Hist.TGraphBentErrors.Implementation

ITAttMarker TGraphBentErrors 
Instance details

Defined in HROOT.Hist.TGraphBentErrors.Implementation

ITNamed TGraphBentErrors 
Instance details

Defined in HROOT.Hist.TGraphBentErrors.Implementation

Methods

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

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

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

ITObject TGraphBentErrors 
Instance details

Defined in HROOT.Hist.TGraphBentErrors.Implementation

ITGraph TGraphBentErrors Source # 
Instance details

Defined in HROOT.Hist.TGraphBentErrors.Implementation

Methods

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

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

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

drawPanelTGraph :: TGraphBentErrors -> IO () Source #

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

fitPanelTGraph :: TGraphBentErrors -> IO () Source #

getCorrelationFactorTGraph :: TGraphBentErrors -> IO CDouble Source #

getCovarianceTGraph :: TGraphBentErrors -> IO CDouble Source #

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

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

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

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

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

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

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

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

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

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

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

insertPoint :: TGraphBentErrors -> IO CInt Source #

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

isEditable :: TGraphBentErrors -> IO CBool Source #

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

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

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

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

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

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

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

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

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

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

ITGraphBentErrors TGraphBentErrors Source # 
Instance details

Defined in HROOT.Hist.TGraphBentErrors.Implementation

Show TGraphBentErrors Source # 
Instance details

Defined in HROOT.Hist.TGraphBentErrors.RawType

FPtr TGraphBentErrors Source # 
Instance details

Defined in HROOT.Hist.TGraphBentErrors.RawType

Associated Types

type Raw TGraphBentErrors #

Eq TGraphBentErrors Source # 
Instance details

Defined in HROOT.Hist.TGraphBentErrors.RawType

Ord TGraphBentErrors Source # 
Instance details

Defined in HROOT.Hist.TGraphBentErrors.RawType

IDeletable TGraphBentErrors Source # 
Instance details

Defined in HROOT.Hist.TGraphBentErrors.Implementation

Methods

delete :: TGraphBentErrors -> IO () #

Castable TGraphBentErrors (Ptr RawTGraphBentErrors) Source # 
Instance details

Defined in HROOT.Hist.TGraphBentErrors.Cast

type Raw TGraphBentErrors Source # 
Instance details

Defined in HROOT.Hist.TGraphBentErrors.RawType