HROOT-graf-0.10.0.3: Haskell binding to ROOT Graf modules
Safe HaskellSafe-Inferred
LanguageHaskell2010

HROOT.Graf.TGraphPolar

Documentation

newtype TGraphPolar Source #

Instances

Instances details
ITAttFill TGraphPolar 
Instance details

Defined in HROOT.Graf.TGraphPolar.Implementation

ITAttLine TGraphPolar 
Instance details

Defined in HROOT.Graf.TGraphPolar.Implementation

ITAttMarker TGraphPolar 
Instance details

Defined in HROOT.Graf.TGraphPolar.Implementation

ITNamed TGraphPolar 
Instance details

Defined in HROOT.Graf.TGraphPolar.Implementation

Methods

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

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

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

ITObject TGraphPolar 
Instance details

Defined in HROOT.Graf.TGraphPolar.Implementation

Methods

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

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

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

getName :: TGraphPolar -> IO CString

isA :: TGraphPolar -> IO TClass

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

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

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

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

write_ :: TGraphPolar -> IO CInt

ITGraphPolar TGraphPolar Source # 
Instance details

Defined in HROOT.Graf.TGraphPolar.Implementation

ITGraph TGraphPolar 
Instance details

Defined in HROOT.Graf.TGraphPolar.Implementation

Methods

apply :: (ITF1 c0, FPtr c0) => TGraphPolar -> c0 -> IO ()

chisquare :: (ITF1 c0, FPtr c0) => TGraphPolar -> c0 -> IO CDouble

drawGraph :: Castable c0 CString => TGraphPolar -> CInt -> Ptr CDouble -> Ptr CDouble -> c0 -> IO ()

drawPanelTGraph :: TGraphPolar -> IO ()

expand :: TGraphPolar -> CInt -> CInt -> IO ()

fitPanelTGraph :: TGraphPolar -> IO ()

getCorrelationFactorTGraph :: TGraphPolar -> IO CDouble

getCovarianceTGraph :: TGraphPolar -> IO CDouble

getMeanTGraph :: TGraphPolar -> CInt -> IO CDouble

getRMSTGraph :: TGraphPolar -> CInt -> IO CDouble

getErrorX :: TGraphPolar -> CInt -> IO CDouble

getErrorY :: TGraphPolar -> CInt -> IO CDouble

getErrorXhigh :: TGraphPolar -> CInt -> IO CDouble

getErrorXlow :: TGraphPolar -> CInt -> IO CDouble

getErrorYhigh :: TGraphPolar -> CInt -> IO CDouble

getErrorYlow :: TGraphPolar -> CInt -> IO CDouble

initExpo :: TGraphPolar -> CDouble -> CDouble -> IO ()

initGaus :: TGraphPolar -> CDouble -> CDouble -> IO ()

initPolynom :: TGraphPolar -> CDouble -> CDouble -> IO ()

insertPoint :: TGraphPolar -> IO CInt

integralTGraph :: TGraphPolar -> CInt -> CInt -> IO CDouble

isEditable :: TGraphPolar -> IO CBool

isInsideTGraph :: TGraphPolar -> CDouble -> CDouble -> IO CInt

leastSquareFit :: TGraphPolar -> CInt -> Ptr CDouble -> CDouble -> CDouble -> IO ()

paintStats :: (ITF1 c0, FPtr c0) => TGraphPolar -> c0 -> IO ()

removePoint :: TGraphPolar -> CInt -> IO CInt

setEditable :: TGraphPolar -> CBool -> IO ()

setHistogram :: (ITH1F c0, FPtr c0) => TGraphPolar -> c0 -> IO ()

setMaximumTGraph :: TGraphPolar -> CDouble -> IO ()

setMinimumTGraph :: TGraphPolar -> CDouble -> IO ()

set :: TGraphPolar -> CInt -> IO ()

setPoint :: TGraphPolar -> CInt -> CDouble -> CDouble -> IO ()

ITGraphErrors TGraphPolar 
Instance details

Defined in HROOT.Graf.TGraphPolar.Implementation

Methods

setPointError :: TGraphPolar -> CInt -> CDouble -> CDouble -> IO ()

Show TGraphPolar Source # 
Instance details

Defined in HROOT.Graf.TGraphPolar.RawType

FPtr TGraphPolar Source # 
Instance details

Defined in HROOT.Graf.TGraphPolar.RawType

Associated Types

type Raw TGraphPolar #

Eq TGraphPolar Source # 
Instance details

Defined in HROOT.Graf.TGraphPolar.RawType

Ord TGraphPolar Source # 
Instance details

Defined in HROOT.Graf.TGraphPolar.RawType

IDeletable TGraphPolar Source # 
Instance details

Defined in HROOT.Graf.TGraphPolar.Implementation

Methods

delete :: TGraphPolar -> IO () #

Castable TGraphPolar (Ptr RawTGraphPolar) Source # 
Instance details

Defined in HROOT.Graf.TGraphPolar.Cast

Methods

cast :: TGraphPolar -> (Ptr RawTGraphPolar -> IO r) -> IO r #

uncast :: Ptr RawTGraphPolar -> (TGraphPolar -> IO r) -> IO r #

type Raw TGraphPolar Source # 
Instance details

Defined in HROOT.Graf.TGraphPolar.RawType

class ITGraphErrors a => ITGraphPolar a Source #

Instances

Instances details
ITGraphPolar TGraphPolar Source # 
Instance details

Defined in HROOT.Graf.TGraphPolar.Implementation