Safe Haskell | None |
---|
- styleColor :: Int -> AlphaColour Double
- styleSymbol :: Int -> PlotKind
- iplot :: (PlotValue x, PlotValue y) => [InternalPlot x y] -> Layout x y
- name :: [PlotKind] -> String
- str2k :: String -> [PlotKind]
- str2khelper :: String -> PlotKind -> [PlotKind]
- data PlotKind
- data InternalPlot x y
- newtype LayoutDDD = LayoutDDD {}
- layoutDddToRenderable :: LayoutDDD -> Renderable (LayoutPick Double Double Double)
- uplot :: [UPlot] -> LayoutDDD
- plot :: PlotType a => a
- class PlotType t where
- plotPDF :: PlotPDFType a => String -> a
- class PlotPDFType t where
- plotPS :: PlotPSType a => String -> a
- class PlotPSType t where
- plotPNG :: PlotPNGType a => String -> a
- class PlotPNGType t where
- data UPlot
- xcoords :: [Double] -> UPlot
- class PlotArg a where
- class IsPlot c where
Documentation
styleColor :: Int -> AlphaColour DoubleSource
styleSymbol :: Int -> PlotKindSource
str2khelper :: String -> PlotKind -> [PlotKind]Source
Type to define a few simple properties of each plot.
The main plotting function. The idea behind PlotType is shamelessly copied from Text.Printf (and is not exported). All you need to know is that your arguments need to be in class PlotArg. And PlotArg consists of functions and [Double] and String and PlotKind or [PlotKind].
plotPDF :: PlotPDFType a => String -> aSource
Save a plot as a PDF file.
class PlotPDFType t whereSource
(PlotArg a, PlotPDFType r) => PlotPDFType (a -> r) |
plotPS :: PlotPSType a => String -> aSource
Save a plot as a postscript file.
class PlotPSType t whereSource
(PlotArg a, PlotPSType r) => PlotPSType (a -> r) |
plotPNG :: PlotPNGType a => String -> aSource
Save a plot as a png file.
class PlotPNGType t whereSource
(PlotArg a, PlotPNGType r) => PlotPNGType (a -> r) |