2014-10-06 21:14:23 +00:00
|
|
|
{-# OPTIONS_HADDOCK ignore-exports #-}
|
|
|
|
|
2014-10-10 15:40:08 +00:00
|
|
|
module Graphics.Diagram.Plotter where
|
2014-09-30 22:05:29 +00:00
|
|
|
|
2014-10-10 15:40:08 +00:00
|
|
|
import Algebra.VectorTypes
|
|
|
|
import Algorithms.ConvexHull.GrahamScan
|
2014-11-15 13:24:24 +00:00
|
|
|
import Algorithms.QuadTree.QuadTree
|
2014-10-25 01:15:38 +00:00
|
|
|
import Algorithms.PolygonIntersection.Core
|
2014-11-14 20:28:56 +00:00
|
|
|
import Data.Maybe
|
2014-10-14 19:24:21 +00:00
|
|
|
import Data.Monoid
|
2014-11-15 02:58:38 +00:00
|
|
|
import Data.Tree
|
2014-09-30 22:05:29 +00:00
|
|
|
import Diagrams.Backend.Cairo
|
2014-10-14 19:24:21 +00:00
|
|
|
import Diagrams.Prelude hiding ((<>))
|
2014-11-15 02:58:38 +00:00
|
|
|
import Diagrams.TwoD.Layout.Tree
|
2014-10-10 15:40:08 +00:00
|
|
|
import Graphics.Diagram.Types
|
2014-11-14 20:28:56 +00:00
|
|
|
import Parser.PathParser
|
2014-10-10 13:40:56 +00:00
|
|
|
|
|
|
|
|
2014-10-08 17:23:40 +00:00
|
|
|
-- |Creates a Diagram that shows the coordinates from the points
|
|
|
|
-- as dots. The points and thickness of the dots can be controlled
|
2014-10-06 19:11:28 +00:00
|
|
|
-- via DiagProp.
|
2014-10-09 15:19:58 +00:00
|
|
|
coordPoints :: Diag
|
2014-10-09 22:42:15 +00:00
|
|
|
coordPoints = Diag cp
|
2014-10-06 19:11:28 +00:00
|
|
|
where
|
2014-10-25 13:40:10 +00:00
|
|
|
cp p (Object vt) = drawP vt p
|
|
|
|
cp p (Objects vts) = drawP (concat vts) p
|
|
|
|
drawP [] _ = mempty
|
|
|
|
drawP vt p =
|
2014-10-25 21:54:07 +00:00
|
|
|
position (zip (filterValidPT p vt)
|
2014-10-09 22:19:05 +00:00
|
|
|
(repeat dot))
|
|
|
|
where
|
|
|
|
dot = (circle $ t p :: Diagram Cairo R2) # fc black
|
2014-10-06 19:11:28 +00:00
|
|
|
|
|
|
|
|
2014-10-10 13:34:18 +00:00
|
|
|
-- |Creates a Diagram from a point that shows the coordinates
|
|
|
|
-- in text format, such as "(1.0, 2.0)".
|
|
|
|
pointToTextCoord :: PT -> Diagram Cairo R2
|
|
|
|
pointToTextCoord pt =
|
2014-10-25 22:19:58 +00:00
|
|
|
text ("(" ++ (show . trim') x ++ ", " ++ (show . trim') y ++ ")") # scale 10
|
2014-10-10 13:34:18 +00:00
|
|
|
where
|
2014-11-13 22:05:56 +00:00
|
|
|
trim' :: Double -> Double
|
2014-11-15 22:20:05 +00:00
|
|
|
trim' x' = fromInteger . round $ x' * (10^(2 :: Int)) /
|
|
|
|
(10.0^^(2 :: Int))
|
2014-10-10 13:34:18 +00:00
|
|
|
(x, y) = unp2 pt
|
|
|
|
|
|
|
|
|
2014-10-10 13:34:38 +00:00
|
|
|
-- |Show coordinates as text above all points.
|
2014-10-10 13:03:12 +00:00
|
|
|
coordPointsText :: Diag
|
|
|
|
coordPointsText = Diag cpt
|
|
|
|
where
|
2014-10-25 13:40:10 +00:00
|
|
|
cpt p (Object vt) = drawT vt p
|
|
|
|
cpt p (Objects vts) = drawT (concat vts) p
|
|
|
|
drawT [] _ = mempty
|
|
|
|
drawT vt p
|
|
|
|
| ct p =
|
|
|
|
position $
|
|
|
|
zip vtf (pointToTextCoord <$> vtf) # translate (r2 (0, 10))
|
|
|
|
| otherwise = mempty
|
2014-10-10 21:59:02 +00:00
|
|
|
where
|
2014-10-25 21:54:07 +00:00
|
|
|
vtf = filterValidPT p vt
|
2014-10-10 13:03:12 +00:00
|
|
|
|
|
|
|
|
2014-10-25 01:15:38 +00:00
|
|
|
-- |Draw the lines of the polygon.
|
|
|
|
polyLines :: Diag
|
|
|
|
polyLines = Diag pp
|
|
|
|
where
|
2014-10-25 13:40:10 +00:00
|
|
|
pp _ (Objects []) = mempty
|
|
|
|
pp p (Objects (x:y:_)) =
|
|
|
|
strokePoly x <> strokePoly y
|
2014-10-25 01:15:38 +00:00
|
|
|
where
|
2014-10-25 13:40:10 +00:00
|
|
|
strokePoly x' =
|
|
|
|
(strokeTrail .
|
|
|
|
fromVertices $
|
|
|
|
vtf x' ++ [head . vtf $ x']) #
|
|
|
|
moveTo (head x') #
|
|
|
|
lc black
|
2014-10-25 21:54:07 +00:00
|
|
|
vtf = filterValidPT p
|
2014-10-25 13:40:10 +00:00
|
|
|
pp _ _ = mempty
|
2014-10-25 01:15:38 +00:00
|
|
|
|
|
|
|
|
|
|
|
-- |Show the intersection points of two polygons as red dots.
|
2014-10-25 13:40:10 +00:00
|
|
|
polyIntersection :: Diag
|
|
|
|
polyIntersection = Diag pi'
|
2014-10-25 01:15:38 +00:00
|
|
|
where
|
2014-10-25 13:40:10 +00:00
|
|
|
pi' p (Objects (x:y:_)) = position (zip vtpi (repeat dot))
|
|
|
|
where
|
2014-10-25 21:54:07 +00:00
|
|
|
paF = filterValidPT p x
|
|
|
|
pbF = filterValidPT p y
|
2014-10-25 13:40:10 +00:00
|
|
|
dot = (circle $ t p :: Diagram Cairo R2) # fc red # lc red
|
|
|
|
vtpi = intersectionPoints
|
|
|
|
. sortLexPolys
|
|
|
|
$ (sortLexPoly paF, sortLexPoly pbF)
|
|
|
|
pi' _ _ = mempty
|
2014-10-25 01:15:38 +00:00
|
|
|
|
|
|
|
|
|
|
|
-- |Show the intersection points of two polygons as red dots.
|
2014-10-25 13:40:10 +00:00
|
|
|
polyIntersectionText :: Diag
|
|
|
|
polyIntersectionText = Diag pit'
|
2014-10-25 01:15:38 +00:00
|
|
|
where
|
2014-10-25 13:40:10 +00:00
|
|
|
pit' p (Objects (x:y:_))
|
|
|
|
| ct p =
|
|
|
|
position $
|
|
|
|
zip vtpi
|
|
|
|
(pointToTextCoord # fc red <$> vtpi) # translate (r2 (0, 10))
|
|
|
|
| otherwise = mempty
|
|
|
|
where
|
2014-10-25 21:54:07 +00:00
|
|
|
paF = filterValidPT p x
|
|
|
|
pbF = filterValidPT p y
|
2014-10-25 13:40:10 +00:00
|
|
|
vtpi = intersectionPoints
|
|
|
|
. sortLexPolys
|
|
|
|
$ (sortLexPoly paF, sortLexPoly pbF)
|
|
|
|
pit' _ _ = mempty
|
2014-10-25 01:15:38 +00:00
|
|
|
|
|
|
|
|
2014-10-08 14:39:46 +00:00
|
|
|
-- |Create a diagram which shows the points of the convex hull.
|
2014-10-13 18:14:50 +00:00
|
|
|
convexHP :: Diag
|
|
|
|
convexHP = Diag chp
|
2014-10-08 14:39:46 +00:00
|
|
|
where
|
2014-10-25 13:40:10 +00:00
|
|
|
chp p (Object vt) =
|
2014-10-14 08:56:06 +00:00
|
|
|
position (zip vtch
|
2014-10-09 22:19:05 +00:00
|
|
|
(repeat dot))
|
|
|
|
where
|
|
|
|
dot = (circle $ t p :: Diagram Cairo R2) # fc red # lc red
|
2014-10-25 21:54:07 +00:00
|
|
|
vtch = grahamCH $ filterValidPT p vt
|
2014-10-25 13:40:10 +00:00
|
|
|
chp _ _ = mempty
|
2014-10-08 14:39:46 +00:00
|
|
|
|
|
|
|
|
2014-10-10 13:34:38 +00:00
|
|
|
-- |Show coordinates as text above the convex hull points.
|
2014-10-13 18:14:50 +00:00
|
|
|
convexHPText :: Diag
|
|
|
|
convexHPText = Diag chpt
|
2014-10-10 13:03:12 +00:00
|
|
|
where
|
2014-10-25 13:40:10 +00:00
|
|
|
chpt p (Object vt)
|
|
|
|
| ct p =
|
|
|
|
position $
|
|
|
|
zip vtchf
|
|
|
|
(pointToTextCoord <$> vtchf) # translate (r2 (0, 10))
|
|
|
|
| otherwise = mempty
|
2014-10-10 13:03:12 +00:00
|
|
|
where
|
2014-10-25 21:54:07 +00:00
|
|
|
vtchf = grahamCH . filterValidPT p $ vt
|
2014-10-25 13:40:10 +00:00
|
|
|
chpt _ _ = mempty
|
2014-10-10 13:03:12 +00:00
|
|
|
|
|
|
|
|
2014-10-09 01:10:21 +00:00
|
|
|
-- |Create a diagram which shows the lines along the convex hull
|
|
|
|
-- points.
|
2014-10-13 18:14:50 +00:00
|
|
|
convexHLs :: Diag
|
|
|
|
convexHLs = Diag chl
|
2014-10-08 17:31:55 +00:00
|
|
|
where
|
2014-10-25 13:40:10 +00:00
|
|
|
chl _ (Object []) = mempty
|
|
|
|
chl p (Object vt) =
|
2014-10-09 22:19:05 +00:00
|
|
|
(strokeTrail .
|
|
|
|
fromVertices .
|
2014-10-13 17:49:53 +00:00
|
|
|
flip (++) [head $ grahamCH vtf] .
|
|
|
|
grahamCH $
|
|
|
|
vtf) #
|
|
|
|
moveTo (head $ grahamCH vtf) #
|
2014-10-09 22:19:05 +00:00
|
|
|
lc red
|
2014-10-09 16:51:32 +00:00
|
|
|
where
|
2014-10-25 21:54:07 +00:00
|
|
|
vtf = filterValidPT p vt
|
2014-10-25 13:40:10 +00:00
|
|
|
chl _ _ = mempty
|
2014-10-08 17:31:55 +00:00
|
|
|
|
|
|
|
|
2014-10-13 18:14:50 +00:00
|
|
|
-- |Create list of diagrama which describe the lines along points of a half
|
|
|
|
-- convex hull, for each iteration of the algorithm. Which half is chosen
|
|
|
|
-- depends on the input.
|
2014-10-25 21:54:07 +00:00
|
|
|
convexHStepsLs :: Diag
|
|
|
|
convexHStepsLs = GifDiag chs
|
2014-10-09 22:19:05 +00:00
|
|
|
where
|
2014-10-25 21:54:07 +00:00
|
|
|
chs p col f vt =
|
|
|
|
fmap mkChDiag (f . filterValidPT p $ vt)
|
|
|
|
where
|
|
|
|
mkChDiag vt' =
|
|
|
|
(strokeTrail . fromVertices $ vt') # moveTo (head vt') # lc col
|
2014-10-09 01:10:21 +00:00
|
|
|
|
|
|
|
|
2014-11-14 20:29:10 +00:00
|
|
|
-- |Create a diagram that shows all squares of the RangeSearch algorithm
|
|
|
|
-- from the quad tree.
|
2014-11-13 22:05:56 +00:00
|
|
|
squares :: Diag
|
|
|
|
squares = Diag f
|
|
|
|
where
|
2014-11-15 22:20:05 +00:00
|
|
|
f _ (Object []) = mempty
|
2014-11-13 22:05:56 +00:00
|
|
|
f p (Object vt) =
|
|
|
|
mconcat
|
2014-11-15 22:20:05 +00:00
|
|
|
$ (\((xmin', xmax'), (ymin', ymax')) -> rect (xmax' - xmin') (ymax' - ymin')
|
|
|
|
# moveTo (p2 ((xmax' + xmin') / 2, (ymax' + ymin') / 2)) # lw ultraThin)
|
2014-11-14 20:29:10 +00:00
|
|
|
<$> (quadTreeSquares (dX p, dY p) . quadTree vtf $ (dX p, dY p))
|
2014-11-13 22:05:56 +00:00
|
|
|
where
|
|
|
|
vtf = filterValidPT p vt
|
|
|
|
f _ _ = mempty
|
|
|
|
|
|
|
|
|
2014-11-15 22:20:05 +00:00
|
|
|
|
|
|
|
qt :: [PT] -> DiagProp -> QuadTree PT
|
|
|
|
qt vt p = quadTree (filterValidPT p vt) (dX p, dY p)
|
|
|
|
|
|
|
|
|
2014-11-14 20:28:56 +00:00
|
|
|
-- |Create a diagram that shows a single square of the RangeSearch algorithm
|
|
|
|
-- from the quad tree in red, according to the given path in pQt.
|
|
|
|
quadPathSquare :: Diag
|
|
|
|
quadPathSquare = Diag f
|
|
|
|
where
|
2014-11-15 22:20:05 +00:00
|
|
|
f _ (Object []) = mempty
|
2014-11-14 20:28:56 +00:00
|
|
|
f p (Object vt) =
|
2014-11-15 22:20:05 +00:00
|
|
|
(\((xmin', xmax'), (ymin', ymax')) -> rect (xmax' - xmin') (ymax' - ymin')
|
|
|
|
# moveTo (p2 ((xmax' + xmin') / 2,(ymax' + ymin') / 2)) # lw thin # lc red)
|
|
|
|
(getSquare (stringToQuads (pQt p)) (qt vt p, []))
|
2014-11-14 20:28:56 +00:00
|
|
|
where
|
2014-11-14 21:58:21 +00:00
|
|
|
getSquare :: [Either Quad Orient] -> Zipper PT -> Square
|
2014-11-14 20:28:56 +00:00
|
|
|
getSquare [] z = getSquareByZipper (dX p, dY p) z
|
|
|
|
getSquare (q:qs) z = case q of
|
2014-11-14 21:58:21 +00:00
|
|
|
Right x -> getSquare qs (fromMaybe z (findNeighbor x z))
|
|
|
|
Left x -> getSquare qs (fromMaybe z (goQuad x z))
|
2014-11-15 22:20:05 +00:00
|
|
|
f _ _ = mempty
|
2014-11-14 20:28:56 +00:00
|
|
|
|
|
|
|
|
2014-11-14 21:19:14 +00:00
|
|
|
-- |Create a list of diagrams that show the walk along the given path
|
|
|
|
-- through the quad tree.
|
|
|
|
gifQuadPath :: Diag
|
|
|
|
gifQuadPath = GifDiag f
|
|
|
|
where
|
|
|
|
f p col _ vt =
|
2014-11-15 22:20:05 +00:00
|
|
|
(\((xmin', xmax'), (ymin', ymax')) -> rect (xmax' - xmin') (ymax' - ymin')
|
|
|
|
# moveTo (p2 ((xmax' + xmin') / 2,(ymax' + ymin') / 2)) # lw thick # lc col)
|
|
|
|
<$> getSquares (stringToQuads (pQt p)) (qt vt p, [])
|
2014-11-14 21:19:14 +00:00
|
|
|
where
|
2014-11-14 21:58:21 +00:00
|
|
|
getSquares :: [Either Quad Orient] -> Zipper PT -> [Square]
|
2014-11-14 21:19:14 +00:00
|
|
|
getSquares [] z = [getSquareByZipper (dX p, dY p) z]
|
|
|
|
getSquares (q:qs) z = case q of
|
2014-11-14 21:58:21 +00:00
|
|
|
Right x -> getSquareByZipper (dX p, dY p) z :
|
|
|
|
getSquares qs (fromMaybe z (findNeighbor x z))
|
|
|
|
Left x -> getSquareByZipper (dX p, dY p) z :
|
|
|
|
getSquares qs (fromMaybe z (goQuad x z))
|
2014-11-14 21:19:14 +00:00
|
|
|
|
|
|
|
|
2014-11-15 02:58:38 +00:00
|
|
|
-- |A diagram that shows the full Quad Tree with nodes.
|
|
|
|
treePretty :: Diag
|
|
|
|
treePretty = Diag f
|
|
|
|
where
|
2014-11-15 22:20:05 +00:00
|
|
|
f _ (Object []) = mempty
|
2014-11-15 14:26:43 +00:00
|
|
|
f p (Object vt) =
|
2014-11-15 22:20:05 +00:00
|
|
|
prettyRoseTree (quadTreeToRoseTree . flip getCurQT (qt vt p, []) . stringToQuads . pQt $ p)
|
2014-11-15 02:58:38 +00:00
|
|
|
where
|
2014-11-15 14:26:43 +00:00
|
|
|
getCurQT :: [Either Quad Orient] -> Zipper PT -> Zipper PT
|
|
|
|
getCurQT [] z = z
|
|
|
|
getCurQT (q:qs) z = case q of
|
|
|
|
Right x -> getCurQT qs (fromMaybe z (findNeighbor x z))
|
|
|
|
Left x -> getCurQT qs (fromMaybe z (goQuad x z))
|
2014-11-15 02:58:38 +00:00
|
|
|
prettyRoseTree :: Tree String -> Diagram Cairo R2
|
2014-11-15 22:20:05 +00:00
|
|
|
prettyRoseTree tree =
|
2014-11-15 14:26:43 +00:00
|
|
|
renderTree (\n -> case head n of
|
|
|
|
'*' ->
|
|
|
|
(text n # fontSizeL 5.0)
|
|
|
|
<> rect 50.0 20.0 # fc red
|
|
|
|
_ ->
|
|
|
|
(text n # fontSizeL 5.0)
|
|
|
|
<> rect 50.0 20.0 # fc white)
|
2014-11-15 02:58:38 +00:00
|
|
|
(~~)
|
2014-11-15 22:20:05 +00:00
|
|
|
(symmLayout' (with & slHSep .~ 60 & slVSep .~ 40) tree)
|
2014-11-15 02:58:38 +00:00
|
|
|
# scale 2 # alignT # bg white
|
2014-11-15 22:20:05 +00:00
|
|
|
f _ _ = mempty
|
2014-11-15 02:58:38 +00:00
|
|
|
|
|
|
|
|
2014-10-06 19:11:28 +00:00
|
|
|
-- |Creates a Diagram that shows an XAxis which is bound
|
|
|
|
-- by the dimensions given in xD from DiagProp.
|
2014-10-09 15:19:58 +00:00
|
|
|
xAxis :: Diag
|
2014-10-09 22:19:05 +00:00
|
|
|
xAxis =
|
2014-10-14 19:24:21 +00:00
|
|
|
Diag hRule <>
|
|
|
|
Diag segments <>
|
2014-10-11 01:59:21 +00:00
|
|
|
Diag labels
|
2014-10-06 19:11:28 +00:00
|
|
|
where
|
2014-10-09 22:19:05 +00:00
|
|
|
hRule p _ =
|
2014-10-11 11:49:53 +00:00
|
|
|
arrowAt (p2 (xmin p, if ymin p <= 0 then 0 else ymin p))
|
2014-10-11 01:59:21 +00:00
|
|
|
(r2 (w' p, 0))
|
2014-10-09 22:19:05 +00:00
|
|
|
segments p _ =
|
2014-10-11 01:59:21 +00:00
|
|
|
hcat' (with & sep .~ sqS p)
|
|
|
|
(replicate (floor . (/) (w' p) $ sqS p)
|
|
|
|
(vrule 10)) #
|
2014-10-11 11:49:53 +00:00
|
|
|
moveTo (p2 (xmin p, if ymin p <= 0 then 0 else ymin p))
|
2014-10-09 19:37:45 +00:00
|
|
|
labels p _ =
|
2014-10-09 22:19:05 +00:00
|
|
|
position $
|
|
|
|
zip (mkPoint <$> xs)
|
2014-10-10 21:28:01 +00:00
|
|
|
((\x -> (text . show $ x) # scale 10) <$> xs)
|
2014-10-09 22:19:05 +00:00
|
|
|
where
|
|
|
|
xs :: [Int]
|
2014-10-11 01:59:21 +00:00
|
|
|
xs = take (floor . (/) (w' p) $ sqS p)
|
|
|
|
(iterate (+(floor . sqS $ p)) (floor . xmin $ p))
|
2014-10-11 11:49:53 +00:00
|
|
|
mkPoint x = p2 (fromIntegral x,
|
|
|
|
-15 + (if ymin p <= 0 then 0 else ymin p))
|
2014-10-06 19:11:28 +00:00
|
|
|
|
|
|
|
|
|
|
|
-- |Creates a Diagram that shows an YAxis which is bound
|
|
|
|
-- by the dimensions given in yD from DiagProp.
|
2014-10-09 15:19:58 +00:00
|
|
|
yAxis :: Diag
|
2014-10-09 22:19:05 +00:00
|
|
|
yAxis =
|
2014-10-14 19:24:21 +00:00
|
|
|
Diag vRule <>
|
|
|
|
Diag segments <>
|
2014-10-11 01:59:21 +00:00
|
|
|
Diag labels
|
2014-10-06 19:11:28 +00:00
|
|
|
where
|
2014-10-09 22:19:05 +00:00
|
|
|
vRule p _ =
|
2014-10-11 11:49:53 +00:00
|
|
|
arrowAt (p2 (if xmin p <= 0 then 0 else xmin p, ymin p))
|
2014-10-11 01:59:21 +00:00
|
|
|
(r2 (0, h' p))
|
2014-10-09 22:19:05 +00:00
|
|
|
segments p _ =
|
2014-10-11 01:59:21 +00:00
|
|
|
vcat' (with & sep .~ sqS p)
|
|
|
|
(replicate (floor . (/) (h' p) $ sqS p)
|
|
|
|
(hrule 10)) #
|
2014-10-09 22:19:05 +00:00
|
|
|
alignB #
|
2014-10-11 11:49:53 +00:00
|
|
|
moveTo (p2 (if xmin p <= 0 then 0 else xmin p, ymin p))
|
2014-10-09 19:37:45 +00:00
|
|
|
labels p _ =
|
2014-10-09 22:19:05 +00:00
|
|
|
position $
|
|
|
|
zip (mkPoint <$> ys)
|
2014-10-10 21:28:01 +00:00
|
|
|
((\x -> (text . show $ x) # scale 10) <$> ys)
|
2014-10-09 19:37:45 +00:00
|
|
|
where
|
|
|
|
ys :: [Int]
|
2014-10-11 01:59:21 +00:00
|
|
|
ys = take (floor . (/) (h' p) $ sqS p)
|
|
|
|
(iterate (+(floor . sqS $ p)) (floor . ymin $ p))
|
2014-10-11 11:49:53 +00:00
|
|
|
mkPoint y = p2 (-15 + (if xmin p <= 0 then 0 else xmin p),
|
|
|
|
fromIntegral y)
|
2014-10-06 19:11:28 +00:00
|
|
|
|
|
|
|
|
|
|
|
-- |Creates a Diagram that shows a white rectangle which is a little
|
2014-10-10 15:40:08 +00:00
|
|
|
-- bit bigger than both X and Y axis dimensions from DiagProp.
|
2014-10-09 15:19:58 +00:00
|
|
|
whiteRectB :: Diag
|
2014-10-09 22:42:15 +00:00
|
|
|
whiteRectB = Diag rect'
|
2014-10-06 19:11:28 +00:00
|
|
|
where
|
2014-10-11 01:59:21 +00:00
|
|
|
rect' p _ =
|
2014-10-13 17:58:09 +00:00
|
|
|
whiteRect (w' p + (w' p / 10)) (h' p + (h' p / 10)) #
|
2014-10-11 01:59:21 +00:00
|
|
|
moveTo (p2 (wOff p, hOff p))
|
2014-10-08 17:23:15 +00:00
|
|
|
where
|
2014-10-11 01:59:21 +00:00
|
|
|
|
2014-10-06 19:11:28 +00:00
|
|
|
|
2014-10-05 16:41:41 +00:00
|
|
|
-- |Create a white rectangle with the given width and height.
|
2014-10-06 19:22:32 +00:00
|
|
|
whiteRect :: Double -> Double -> Diagram Cairo R2
|
|
|
|
whiteRect x y = rect x y # lwG 0.00 # bg white
|
2014-10-09 16:45:37 +00:00
|
|
|
|
|
|
|
|
2014-10-09 23:08:53 +00:00
|
|
|
-- |Create a grid across the whole diagram with squares of the
|
|
|
|
-- given size in DiagProp.
|
2014-10-09 16:45:37 +00:00
|
|
|
grid :: Diag
|
2014-10-14 19:24:21 +00:00
|
|
|
grid = Diag xGrid <> Diag yGrid
|
2014-10-09 16:45:37 +00:00
|
|
|
where
|
2014-10-25 13:40:10 +00:00
|
|
|
yGrid p _
|
|
|
|
| gd p =
|
|
|
|
hcat' (with & sep .~ sqS p)
|
|
|
|
(replicate (floor . (/) (w' p) $ sqS p)
|
|
|
|
(vrule $ h' p)) #
|
|
|
|
moveTo (p2 (xmin p, hOff p)) #
|
|
|
|
lw ultraThin
|
|
|
|
| otherwise = mempty
|
|
|
|
xGrid p _
|
|
|
|
| gd p =
|
|
|
|
vcat' (with & sep .~ sqS p)
|
|
|
|
(replicate (floor . (/) (h' p) $ sqS p)
|
|
|
|
(hrule $ w' p)) #
|
|
|
|
alignB #
|
|
|
|
moveTo (p2 (wOff p, ymin p)) #
|
|
|
|
lw ultraThin
|
|
|
|
| otherwise = mempty
|
|
|
|
|
|
|
|
|
|
|
|
plotterBG :: Diag
|
|
|
|
plotterBG = mconcat [xAxis, yAxis, grid, whiteRectB]
|