chart-unit-0.3.1: A set of native haskell charts.

Safe HaskellNone
LanguageHaskell2010

Chart.Unit

Synopsis

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 #

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.

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 #

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

rangeV4 :: Traversable f => f (V4 Double) -> V4 (Range Double) Source #

V4 range of a V4 container

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

combine :: Aspect -> [QChart a] -> Chart' a Source #

render a list of qcharts using a common scale

bubble :: forall a. (FromInteger (N a), MultiplicativeGroup (N a), RealFloat (N a), Traced a, V a ~ V2) => [a] -> Int -> [V a (N a)] Source #