Safe Haskell | None |
---|---|
Language | Haskell2010 |
Chart.Unit
- scaleX :: Double -> [Point V2 Double] -> [Point V2 Double]
- scaleY :: Double -> [Point V2 Double] -> [Point V2 Double]
- blob :: (Floating (N a), Ord (N a), Typeable (N a), HasStyle a, V a ~ V2) => Color -> a -> a
- line1 :: (Traversable f, R2 r) => LineConfig -> f (r Double) -> Chart b
- scatter1 :: (Traversable f, R2 r) => ScatterConfig -> f (r Double) -> Chart b
- rect1 :: Traversable f => RectConfig -> f (Rect Double) -> Chart b
- pixel1 :: Traversable f => f (Rect Double, Color) -> Chart b
- arrow1 :: Traversable f => ArrowConfig Double -> f (V4 Double) -> Chart b
- box :: (Field (N t), N t ~ Double, V t ~ V2, HasOrigin t, Transformable t, TrailLike t) => Rect Double -> t
- lineChart :: (R2 r, Traversable f) => [LineConfig] -> Aspect -> [f (r Double)] -> Chart a
- scatterChart :: (R2 r, Traversable f) => [ScatterConfig] -> Aspect -> [f (r Double)] -> Chart a
- histChart :: Traversable f => [RectConfig] -> Aspect -> [f (Rect Double)] -> Chart a
- arrowChart :: Traversable f => ArrowConfig Double -> V4 (Range Double) -> f (V4 Double) -> Chart a
- rangeV4 :: Traversable f => f (V4 Double) -> V4 (Range Double)
- rangeV42Rect :: V4 (Range Double) -> Rect Double
- scaleV4s :: Traversable f => V4 (Range Double) -> f (V4 Double) -> f (V4 Double)
- toPixels :: Rect Double -> (V2 Double -> Double) -> PixelConfig -> [(Rect Double, Color)]
- rescalePixels :: Rect Double -> [(Rect Double, Color)] -> [(Rect Double, Color)]
- pixelf :: PixelConfig -> Aspect -> Rect Double -> (V2 Double -> Double) -> Chart a
- withChart :: (Traversable f, R2 r) => ChartConfig -> (Aspect -> [f (r Double)] -> QDiagram a V2 Double Any) -> [f (r Double)] -> Chart' a
- axes :: ChartConfig -> Chart' a
- combine :: Aspect -> [QChart a] -> Chart' a
- fileSvg :: FilePath -> (Double, Double) -> Chart SVG -> IO ()
- bubble :: forall a. (FromInteger (N a), MultiplicativeGroup (N a), RealFloat (N a), Traced a, V a ~ V2) => [a] -> Int -> [V a (N a)]
- histCompare :: DealOvers -> Histogram -> Histogram -> Chart' a
Documentation
blob :: (Floating (N a), Ord (N a), Typeable (N a), HasStyle a, V a ~ V2) => Color -> a -> a Source #
line1 :: (Traversable f, R2 r) => LineConfig -> f (r Double) -> Chart b Source #
scatter1 :: (Traversable f, R2 r) => ScatterConfig -> f (r Double) -> Chart b Source #
rect1 :: Traversable f => RectConfig -> f (Rect Double) -> Chart b Source #
rectangles specified using a V4 x y z w where (x,y) is location of lower left corner (z,w) is location of upper right corner
pixel1 :: Traversable f => f (Rect Double, Color) -> Chart b Source #
a pixel is a rectangle with a color.
arrow1 :: Traversable f => ArrowConfig Double -> f (V4 Double) -> Chart b Source #
box :: (Field (N t), N t ~ Double, V t ~ V2, HasOrigin t, Transformable t, TrailLike t) => Rect Double -> t Source #
convert from an XY to a polymorphic qdiagrams rectangle
lineChart :: (R2 r, Traversable f) => [LineConfig] -> Aspect -> [f (r Double)] -> Chart a Source #
scatterChart :: (R2 r, Traversable f) => [ScatterConfig] -> Aspect -> [f (r Double)] -> Chart a Source #
histChart :: Traversable f => [RectConfig] -> Aspect -> [f (Rect Double)] -> Chart a Source #
arrowChart :: Traversable f => ArrowConfig Double -> V4 (Range Double) -> f (V4 Double) -> Chart a Source #
arrow lengths and sizes also need to be scaled, and so arrows doesnt fit as neatly into the whole scaling idea
scaleV4s :: Traversable f => V4 (Range Double) -> f (V4 Double) -> f (V4 Double) Source #
scale a double container of V4s from the current range
pixelf :: PixelConfig -> Aspect -> Rect Double -> (V2 Double -> Double) -> Chart a Source #
pixels over an XY using a function
withChart :: (Traversable f, R2 r) => ChartConfig -> (Aspect -> [f (r Double)] -> QDiagram a V2 Double Any) -> [f (r Double)] -> Chart' a Source #
render with a chart configuration
axes :: ChartConfig -> Chart' a Source #