Safe Haskell | None |
---|
Graphics.Rendering.Chart.Simple.Internal
- styleColor :: Int -> AlphaColour Double
- styleSymbol :: Int -> PlotKind
- iplot :: [InternalPlot Double Double] -> Layout1 Double Double
- name :: [PlotKind] -> String
- str2k :: String -> [PlotKind]
- str2khelper :: String -> PlotKind -> [PlotKind]
- data PlotKind
- data InternalPlot x y
- newtype Layout1DDD = Layout1DDD {}
- layout1DddToRenderable :: Layout1DDD -> Renderable (Layout1Pick Double Double)
- uplot :: [UPlot] -> Layout1DDD
- 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.
uplot :: [UPlot] -> Layout1DDDSource
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].
Instances
PlotType Layout1DDD | |
(PlotArg a, PlotType r) => PlotType (a -> r) |
plotPDF :: PlotPDFType a => String -> aSource
Save a plot as a PDF file.
class PlotPDFType t whereSource
Instances
(PlotArg a, PlotPDFType r) => PlotPDFType (a -> r) |
plotPS :: PlotPSType a => String -> aSource
Save a plot as a postscript file.
class PlotPSType t whereSource
Instances
(PlotArg a, PlotPSType r) => PlotPSType (a -> r) |
plotPNG :: PlotPNGType a => String -> aSource
Save a plot as a png file.
class PlotPNGType t whereSource
Instances
(PlotArg a, PlotPNGType r) => PlotPNGType (a -> r) |