module Graphics.Rendering.Chart.Drawing
(
PointShape(..)
, PointStyle(..)
, drawPoint
, alignPath
, alignFillPath
, alignStrokePath
, alignFillPoints
, alignStrokePoints
, alignFillPoint
, alignStrokePoint
, strokePointPath
, fillPointPath
, withRotation
, withTranslation
, withScale
, withScaleX, withScaleY
, withPointStyle
, withDefaultStyle
, drawTextA
, drawTextR
, drawTextsR
, textDrawRect
, textDimension
, defaultColorSeq
, solidLine
, dashedLine
, filledCircles
, hollowCircles
, filledPolygon
, hollowPolygon
, plusses
, exes
, stars
, arrows
, solidFillStyle
, module Graphics.Rendering.Chart.Backend
, point_color
, point_border_color
, point_border_width
, point_radius
, point_shape
) where
import Data.Default.Class
import Control.Lens
import Data.Colour
import Data.Colour.Names
import Data.List (unfoldr)
import Data.Monoid
import Graphics.Rendering.Chart.Backend
import Graphics.Rendering.Chart.Geometry hiding (moveTo)
import qualified Graphics.Rendering.Chart.Geometry as G
withRotation :: Double -> BackendProgram a -> BackendProgram a
withRotation angle = withTransform (rotate angle 1)
withTranslation :: Point -> BackendProgram a -> BackendProgram a
withTranslation p = withTransform (translate (pointToVec p) 1)
withScale :: Vector -> BackendProgram a -> BackendProgram a
withScale v = withTransform (scale v 1)
withScaleX :: Double -> BackendProgram a -> BackendProgram a
withScaleX x = withScale (Vector x 1)
withScaleY :: Double -> BackendProgram a -> BackendProgram a
withScaleY y = withScale (Vector 1 y)
withPointStyle :: PointStyle -> BackendProgram a -> BackendProgram a
withPointStyle (PointStyle cl bcl bw _ _) m =
withLineStyle (def { _line_color = bcl, _line_width = bw }) $
withFillStyle (solidFillStyle cl) m
withDefaultStyle :: BackendProgram a -> BackendProgram a
withDefaultStyle = withLineStyle def . withFillStyle def . withFontStyle def
alignPath :: (Point -> Point) -> Path -> Path
alignPath f = foldPath (G.moveTo . f)
(lineTo . f)
(arc . f)
(arcNeg . f)
close
alignStrokePath :: Path -> BackendProgram Path
alignStrokePath p = do
f <- getPointAlignFn
return $ alignPath f p
alignFillPath :: Path -> BackendProgram Path
alignFillPath p = do
f <- getCoordAlignFn
return $ alignPath f p
alignStrokePoints :: [Point] -> BackendProgram [Point]
alignStrokePoints p = do
f <- getPointAlignFn
return $ fmap f p
alignFillPoints :: [Point] -> BackendProgram [Point]
alignFillPoints p = do
f <- getCoordAlignFn
return $ fmap f p
alignStrokePoint :: Point -> BackendProgram Point
alignStrokePoint p = do
alignfn <- getPointAlignFn
return (alignfn p)
alignFillPoint :: Point -> BackendProgram Point
alignFillPoint p = do
alignfn <- getCoordAlignFn
return (alignfn p)
stepPath :: [Point] -> Path
stepPath (p:ps) = G.moveTo p
<> mconcat (map lineTo ps)
stepPath [] = mempty
strokePointPath :: [Point] -> BackendProgram ()
strokePointPath pts = strokePath $ stepPath pts
fillPointPath :: [Point] -> BackendProgram ()
fillPointPath pts = fillPath $ stepPath pts
drawTextA :: HTextAnchor -> VTextAnchor -> Point -> String -> BackendProgram ()
drawTextA hta vta = drawTextR hta vta 0
drawTextR :: HTextAnchor -> VTextAnchor -> Double -> Point -> String -> BackendProgram ()
drawTextR hta vta angle p s =
withTranslation p $
withRotation theta $ do
ts <- textSize s
drawText (adjustText hta vta ts) s
where
theta = angle*pi/180.0
drawTextsR :: HTextAnchor -> VTextAnchor -> Double -> Point -> String -> BackendProgram ()
drawTextsR hta vta angle p s = case num of
0 -> return ()
1 -> drawTextR hta vta angle p s
_ ->
withTranslation p $
withRotation theta $ do
tss <- mapM textSize ss
let ts = head tss
let
maxh = maximum (map textSizeYBearing tss)
gap = maxh / 2
totalHeight = fromIntegral num*maxh +
(fromIntegral num1)*gap
ys = take num (unfoldr (\y-> Just (y, ygapmaxh))
(yinit vta ts totalHeight))
xs = map (adjustTextX hta) tss
sequence_ (zipWith3 drawT xs ys ss)
where
ss = lines s
num = length ss
drawT x y = drawText (Point x y)
theta = angle*pi/180.0
yinit VTA_Top ts _ = textSizeAscent ts
yinit VTA_BaseLine _ _ = 0
yinit VTA_Centre ts height = height / 2 + textSizeAscent ts
yinit VTA_Bottom ts height = height + textSizeAscent ts
adjustText :: HTextAnchor -> VTextAnchor -> TextSize -> Point
adjustText hta vta ts = Point (adjustTextX hta ts) (adjustTextY vta ts)
adjustTextX :: HTextAnchor -> TextSize -> Double
adjustTextX HTA_Left _ = 0
adjustTextX HTA_Centre ts = (textSizeWidth ts / 2)
adjustTextX HTA_Right ts = textSizeWidth ts
adjustTextY :: VTextAnchor -> TextSize -> Double
adjustTextY VTA_Top ts = textSizeAscent ts
adjustTextY VTA_Centre ts = textSizeYBearing ts / 2
adjustTextY VTA_BaseLine _ = 0
adjustTextY VTA_Bottom ts = textSizeDescent ts
textDrawRect :: HTextAnchor -> VTextAnchor -> Point -> String -> BackendProgram Rect
textDrawRect hta vta (Point x y) s = do
ts <- textSize s
let (w,h,dh) = (textSizeWidth ts, textSizeHeight ts, textSizeDescent ts)
lx = adjustTextX hta ts
ly = adjustTextY vta ts
(x',y') = (x + lx, y + ly + dh)
p1 = Point x' (y' h)
p2 = Point (x' + w) y'
return $ Rect p1 p2
textDimension :: String -> BackendProgram RectSize
textDimension s = do
ts <- textSize s
return (textSizeWidth ts, textSizeHeight ts)
data PointShape = PointShapeCircle
| PointShapePolygon Int Bool
| PointShapePlus
| PointShapeCross
| PointShapeStar
| PointShapeArrowHead Double
| PointShapeEllipse Double Double
data PointStyle = PointStyle
{ _point_color :: AlphaColour Double
, _point_border_color :: AlphaColour Double
, _point_border_width :: Double
, _point_radius :: Double
, _point_shape :: PointShape
}
instance Default PointStyle where
def = PointStyle
{ _point_color = opaque black
, _point_border_color = transparent
, _point_border_width = 0
, _point_radius = 1
, _point_shape = PointShapeCircle
}
drawPoint :: PointStyle
-> Point
-> BackendProgram ()
drawPoint ps@(PointStyle cl _ _ r shape) p = withPointStyle ps $ do
p'@(Point x y) <- alignStrokePoint p
case shape of
PointShapeCircle -> do
let path = arc p' r 0 (2*pi)
fillPath path
strokePath path
PointShapePolygon sides isrot -> do
let intToAngle n =
if isrot
then fromIntegral n * 2*pi/fromIntegral sides
else (0.5 + fromIntegral n)*2*pi/fromIntegral sides
angles = map intToAngle [0 .. sides1]
(p1:p1s) = map (\a -> Point (x + r * sin a)
(y + r * cos a)) angles
let path = G.moveTo p1 <> mconcat (map lineTo p1s) <> lineTo p1
fillPath path
strokePath path
PointShapeArrowHead theta ->
withTranslation p $ withRotation (theta pi/2) $
drawPoint (filledPolygon r 3 True cl) (Point 0 0)
PointShapePlus ->
strokePath $ moveTo' (x+r) y
<> lineTo' (xr) y
<> moveTo' x (yr)
<> lineTo' x (y+r)
PointShapeCross -> do
let rad = r / sqrt 2
strokePath $ moveTo' (x+rad) (y+rad)
<> lineTo' (xrad) (yrad)
<> moveTo' (x+rad) (yrad)
<> lineTo' (xrad) (y+rad)
PointShapeStar -> do
let rad = r / sqrt 2
strokePath $ moveTo' (x+r) y
<> lineTo' (xr) y
<> moveTo' x (yr)
<> lineTo' x (y+r)
<> moveTo' (x+rad) (y+rad)
<> lineTo' (xrad) (yrad)
<> moveTo' (x+rad) (yrad)
<> lineTo' (xrad) (y+rad)
PointShapeEllipse b theta ->
withTranslation p $ withRotation theta $ withScaleX b $ do
let path = arc (Point 0 0) r 0 (2*pi)
fillPath path
strokePath path
defaultColorSeq :: [AlphaColour Double]
defaultColorSeq = cycle $ map opaque [blue, red, green, yellow, cyan, magenta]
solidLine :: Double
-> AlphaColour Double
-> LineStyle
solidLine w cl = LineStyle w cl [] LineCapButt LineJoinMiter
dashedLine :: Double
-> [Double]
-> AlphaColour Double
-> LineStyle
dashedLine w ds cl = LineStyle w cl ds LineCapButt LineJoinMiter
filledCircles :: Double
-> AlphaColour Double
-> PointStyle
filledCircles radius cl =
PointStyle cl transparent 0 radius PointShapeCircle
hollowCircles :: Double
-> Double
-> AlphaColour Double
-> PointStyle
hollowCircles radius w cl =
PointStyle transparent cl w radius PointShapeCircle
hollowPolygon :: Double
-> Double
-> Int
-> Bool
-> AlphaColour Double
-> PointStyle
hollowPolygon radius w sides isrot cl =
PointStyle transparent cl w radius (PointShapePolygon sides isrot)
filledPolygon :: Double
-> Int
-> Bool
-> AlphaColour Double
-> PointStyle
filledPolygon radius sides isrot cl =
PointStyle cl transparent 0 radius (PointShapePolygon sides isrot)
plusses :: Double
-> Double
-> AlphaColour Double
-> PointStyle
plusses radius w cl =
PointStyle transparent cl w radius PointShapePlus
exes :: Double
-> Double
-> AlphaColour Double
-> PointStyle
exes radius w cl =
PointStyle transparent cl w radius PointShapeCross
stars :: Double
-> Double
-> AlphaColour Double
-> PointStyle
stars radius w cl =
PointStyle transparent cl w radius PointShapeStar
arrows :: Double
-> Double
-> Double
-> AlphaColour Double
-> PointStyle
arrows radius angle w cl =
PointStyle transparent cl w radius (PointShapeArrowHead angle)
solidFillStyle :: AlphaColour Double -> FillStyle
solidFillStyle = FillStyleSolid
$( makeLenses ''PointStyle )