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

HROOT.Hist.TH3S.Implementation

Orphan instances

ITArray TH3S Source # 
Instance details

Methods

getAt :: TH3S -> CInt -> IO CDouble

setArray :: TH3S -> CInt -> IO ()

setAt :: TH3S -> CDouble -> CInt -> IO ()

ITArrayS TH3S Source # 
Instance details

ITAtt3D TH3S Source # 
Instance details

ITAttFill TH3S Source # 
Instance details

Methods

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

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

ITAttLine TH3S Source # 
Instance details

ITAttMarker TH3S Source # 
Instance details

ITNamed TH3S Source # 
Instance details

Methods

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

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

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

ITObject TH3S Source # 
Instance details

Methods

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

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

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

getName :: TH3S -> IO CString

isA :: TH3S -> IO TClass

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

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

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

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

write_ :: TH3S -> IO CInt

ITH1 TH3S Source # 
Instance details

Methods

add :: (ITH1 c0, FPtr c0) => TH3S -> c0 -> CDouble -> IO () Source #

addBinContent :: TH3S -> CInt -> CDouble -> IO () Source #

chi2Test :: (Castable c1 CString, ITH1 c0, FPtr c0) => TH3S -> c0 -> c1 -> Ptr CDouble -> IO CDouble Source #

directoryAutoAdd :: (ITDirectory c0, FPtr c0) => TH3S -> c0 -> IO () Source #

divide :: (Castable c2 CString, ITH1 c1, FPtr c1, ITH1 c0, FPtr c0) => TH3S -> c0 -> c1 -> CDouble -> CDouble -> c2 -> IO () Source #

drawCopyTH1 :: Castable c0 CString => TH3S -> c0 -> IO TH3S Source #

drawNormalized :: Castable c0 CString => TH3S -> c0 -> CDouble -> IO TH1 Source #

drawPanelTH1 :: TH3S -> IO () Source #

bufferEmpty :: TH3S -> CInt -> IO CInt Source #

evalF :: (Castable c1 CString, ITF1 c0, FPtr c0) => TH3S -> c0 -> c1 -> IO () Source #

fFT :: (Castable c1 CString, ITH1 c0, FPtr c0) => TH3S -> c0 -> c1 -> IO TH1 Source #

fill1 :: TH3S -> CDouble -> IO CInt Source #

fill1w :: TH3S -> CDouble -> CDouble -> IO CInt Source #

fillN1 :: TH3S -> CInt -> Ptr CDouble -> Ptr CDouble -> CInt -> IO () Source #

fillRandom :: (ITH1 c0, FPtr c0) => TH3S -> c0 -> CInt -> IO () Source #

findBin :: TH3S -> CDouble -> CDouble -> CDouble -> IO CInt Source #

findFixBin :: TH3S -> CDouble -> CDouble -> CDouble -> IO CInt Source #

findFirstBinAbove :: TH3S -> CDouble -> CInt -> IO CInt Source #

findLastBinAbove :: TH3S -> CDouble -> CInt -> IO CInt Source #

fit :: (Castable c2 CString, Castable c1 CString, ITF1 c0, FPtr c0) => TH3S -> c0 -> c1 -> c2 -> CDouble -> CDouble -> IO () Source #

fitPanelTH1 :: TH3S -> IO () Source #

getNdivisionA :: Castable c0 CString => TH3S -> c0 -> IO CInt Source #

getAxisColorA :: Castable c0 CString => TH3S -> c0 -> IO CShort Source #

getLabelColorA :: Castable c0 CString => TH3S -> c0 -> IO CShort Source #

getLabelFontA :: Castable c0 CString => TH3S -> c0 -> IO CShort Source #

getLabelOffsetA :: Castable c0 CString => TH3S -> c0 -> IO CFloat Source #

getLabelSizeA :: Castable c0 CString => TH3S -> c0 -> IO CFloat Source #

getTitleFontA :: Castable c0 CString => TH3S -> c0 -> IO CShort Source #

getTitleOffsetA :: Castable c0 CString => TH3S -> c0 -> IO CFloat Source #

getTitleSizeA :: Castable c0 CString => TH3S -> c0 -> IO CFloat Source #

getTickLengthA :: Castable c0 CString => TH3S -> c0 -> IO CFloat Source #

getBarOffset :: TH3S -> IO CFloat Source #

getBarWidth :: TH3S -> IO CFloat Source #

getContour :: TH3S -> Ptr CDouble -> IO CInt Source #

getContourLevel :: TH3S -> CInt -> IO CDouble Source #

getContourLevelPad :: TH3S -> CInt -> IO CDouble Source #

getBin :: TH3S -> CInt -> CInt -> CInt -> IO CInt Source #

getBinCenter :: TH3S -> CInt -> IO CDouble Source #

getBinContent1 :: TH3S -> CInt -> IO CDouble Source #

getBinContent2 :: TH3S -> CInt -> CInt -> IO CDouble Source #

getBinContent3 :: TH3S -> CInt -> CInt -> CInt -> IO CDouble Source #

getBinError1 :: TH3S -> CInt -> IO CDouble Source #

getBinError2 :: TH3S -> CInt -> CInt -> IO CDouble Source #

getBinError3 :: TH3S -> CInt -> CInt -> CInt -> IO CDouble Source #

getBinLowEdge :: TH3S -> CInt -> IO CDouble Source #

getBinWidth :: TH3S -> CInt -> IO CDouble Source #

getCellContent :: TH3S -> CInt -> CInt -> IO CDouble Source #

getCellError :: TH3S -> CInt -> CInt -> IO CDouble Source #

getEntries :: TH3S -> IO CDouble Source #

getEffectiveEntries :: TH3S -> IO CDouble Source #

getFunction :: Castable c0 CString => TH3S -> c0 -> IO TF1 Source #

getDimension :: TH3S -> IO CInt Source #

getKurtosis :: TH3S -> CInt -> IO CDouble Source #

getLowEdge :: TH3S -> Ptr CDouble -> IO () Source #

getMaximumTH1 :: TH3S -> CDouble -> IO CDouble Source #

getMaximumBin :: TH3S -> IO CInt Source #

getMaximumStored :: TH3S -> IO CDouble Source #

getMinimumTH1 :: TH3S -> CDouble -> IO CDouble Source #

getMinimumBin :: TH3S -> IO CInt Source #

getMinimumStored :: TH3S -> IO CDouble Source #

getMean :: TH3S -> CInt -> IO CDouble Source #

getMeanError :: TH3S -> CInt -> IO CDouble Source #

getNbinsX :: TH3S -> IO CDouble Source #

getNbinsY :: TH3S -> IO CDouble Source #

getNbinsZ :: TH3S -> IO CDouble Source #

getQuantilesTH1 :: TH3S -> CInt -> Ptr CDouble -> Ptr CDouble -> IO CInt Source #

getRandom :: TH3S -> IO CDouble Source #

getStats :: TH3S -> Ptr CDouble -> IO () Source #

getSumOfWeights :: TH3S -> IO CDouble Source #

getSumw2 :: TH3S -> IO TArrayD Source #

getSumw2N :: TH3S -> IO CInt Source #

getRMS :: TH3S -> CInt -> IO CDouble Source #

getRMSError :: TH3S -> CInt -> IO CDouble Source #

getSkewness :: TH3S -> CInt -> IO CDouble Source #

interpolate3 :: TH3S -> CDouble -> CDouble -> CDouble -> IO CDouble Source #

kolmogorovTest :: (Castable c1 CString, ITH1 c0, FPtr c0) => TH3S -> c0 -> c1 -> IO CDouble Source #

labelsDeflate :: Castable c0 CString => TH3S -> c0 -> IO () Source #

labelsInflate :: Castable c0 CString => TH3S -> c0 -> IO () Source #

labelsOption :: (Castable c1 CString, Castable c0 CString) => TH3S -> c0 -> c1 -> IO () Source #

multiflyF :: (ITF1 c0, FPtr c0) => TH3S -> c0 -> CDouble -> IO () Source #

multiply :: (Castable c2 CString, ITH1 c1, FPtr c1, ITH1 c0, FPtr c0) => TH3S -> c0 -> c1 -> CDouble -> CDouble -> c2 -> IO () Source #

putStats :: TH3S -> Ptr CDouble -> IO () Source #

rebin :: Castable c0 CString => TH3S -> CInt -> c0 -> Ptr CDouble -> IO TH1 Source #

rebinAxis :: (ITAxis c0, FPtr c0) => TH3S -> CDouble -> c0 -> IO () Source #

rebuild :: Castable c0 CString => TH3S -> c0 -> IO () Source #

recursiveRemove :: (ITObject c0, FPtr c0) => TH3S -> c0 -> IO () Source #

reset :: Castable c0 CString => TH3S -> c0 -> IO () Source #

resetStats :: TH3S -> IO () Source #

scale :: Castable c0 CString => TH3S -> CDouble -> c0 -> IO () Source #

setAxisColorA :: Castable c0 CString => TH3S -> CShort -> c0 -> IO () Source #

setAxisRange :: Castable c0 CString => TH3S -> CDouble -> CDouble -> c0 -> IO () Source #

setBarOffset :: TH3S -> CFloat -> IO () Source #

setBarWidth :: TH3S -> CFloat -> IO () Source #

setBinContent1 :: TH3S -> CInt -> CDouble -> IO () Source #

setBinContent2 :: TH3S -> CInt -> CInt -> CDouble -> IO () Source #

setBinContent3 :: TH3S -> CInt -> CInt -> CInt -> CDouble -> IO () Source #

setBinError1 :: TH3S -> CInt -> CDouble -> IO () Source #

setBinError2 :: TH3S -> CInt -> CInt -> CDouble -> IO () Source #

setBinError3 :: TH3S -> CInt -> CInt -> CInt -> CDouble -> IO () Source #

setBins1 :: TH3S -> CInt -> Ptr CDouble -> IO () Source #

setBins2 :: TH3S -> CInt -> Ptr CDouble -> CInt -> Ptr CDouble -> IO () Source #

setBins3 :: TH3S -> CInt -> Ptr CDouble -> CInt -> Ptr CDouble -> CInt -> Ptr CDouble -> IO () Source #

setBinsLength :: TH3S -> CInt -> IO () Source #

setBuffer :: Castable c0 CString => TH3S -> CInt -> c0 -> IO () Source #

setCellContent :: TH3S -> CInt -> CInt -> CDouble -> IO () Source #

setContent :: TH3S -> Ptr CDouble -> IO () Source #

setContour :: TH3S -> CInt -> Ptr CDouble -> IO () Source #

setContourLevel :: TH3S -> CInt -> CDouble -> IO () Source #

setDirectory :: (ITDirectory c0, FPtr c0) => TH3S -> c0 -> IO () Source #

setEntries :: TH3S -> CDouble -> IO () Source #

setError :: TH3S -> Ptr CDouble -> IO () Source #

setLabelColorA :: Castable c0 CString => TH3S -> CShort -> c0 -> IO () Source #

setLabelSizeA :: Castable c0 CString => TH3S -> CFloat -> c0 -> IO () Source #

setLabelFontA :: Castable c0 CString => TH3S -> CShort -> c0 -> IO () Source #

setLabelOffsetA :: Castable c0 CString => TH3S -> CFloat -> c0 -> IO () Source #

setMaximum :: TH3S -> CDouble -> IO () Source #

setMinimum :: TH3S -> CDouble -> IO () Source #

setNormFactor :: TH3S -> CDouble -> IO () Source #

setStats :: TH3S -> CBool -> IO () Source #

setOption :: Castable c0 CString => TH3S -> c0 -> IO () Source #

setXTitle :: Castable c0 CString => TH3S -> c0 -> IO () Source #

setYTitle :: Castable c0 CString => TH3S -> c0 -> IO () Source #

setZTitle :: Castable c0 CString => TH3S -> c0 -> IO () Source #

showBackground :: Castable c0 CString => TH3S -> CInt -> c0 -> IO TH1 Source #

showPeaks :: Castable c0 CString => TH3S -> CDouble -> c0 -> CDouble -> IO CInt Source #

smooth :: Castable c0 CString => TH3S -> CInt -> c0 -> IO () Source #

sumw2 :: TH3S -> IO () Source #

ITH3 TH3S Source # 
Instance details

ITH3S TH3S Source # 
Instance details

IDeletable TH3S Source # 
Instance details

Methods

delete :: TH3S -> IO () #