cga/Graphics/Diagram/Plotter.hs

192 行
5.5 KiB
Haskell

{-# 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.Vector
import Algebra.VectorTypes
import Algorithms.ConvexHull.GrahamScan
2014-09-30 22:05:29 +00:00
import Diagrams.Backend.Cairo
import Diagrams.Prelude
2014-10-10 15:40:08 +00:00
import Graphics.Diagram.Types
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
-- via DiagProp.
coordPoints :: Diag
2014-10-09 22:42:15 +00:00
coordPoints = Diag cp
where
2014-10-09 22:42:15 +00:00
cp p vt =
2014-10-09 22:19:05 +00:00
position (zip (filter (inRange (dX p) (dY p)) $ vt)
(repeat dot))
where
dot = (circle $ t p :: Diagram Cairo R2) # fc black
-- |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 =
text ("(" ++ show x ++ ", " ++ show y ++ ")") # scale 10
where
(x, y) = unp2 pt
2014-10-10 13:34:38 +00:00
-- |Show coordinates as text above all points.
coordPointsText :: Diag
coordPointsText = Diag cpt
where
cpt _ vt =
position $
zip vt (pointToTextCoord <$> vt) # translate (r2 (0, 10))
-- |Create a diagram which shows the points of the convex hull.
convexHullPoints :: Diag
2014-10-09 22:42:15 +00:00
convexHullPoints = Diag chp
where
2014-10-09 22:42:15 +00:00
chp p vt =
2014-10-09 22:19:05 +00:00
position (zip (filter (inRange (dX p) (dY p)) $ vtch)
(repeat dot))
where
dot = (circle $ t p :: Diagram Cairo R2) # fc red # lc red
vtch = grahamGetCH vt
2014-10-10 13:34:38 +00:00
-- |Show coordinates as text above the convex hull points.
convexHullPointsText :: Diag
convexHullPointsText = Diag chpt
where
chpt _ vt =
position $
zip vtch
(pointToTextCoord <$> vtch) # translate (r2 (0, 10))
where
vtch = grahamGetCH vt
-- |Create a diagram which shows the lines along the convex hull
-- points.
convexHullLines :: Diag
2014-10-09 22:42:15 +00:00
convexHullLines = Diag chl
2014-10-08 17:31:55 +00:00
where
2014-10-09 22:42:15 +00:00
chl _ [] = mempty
chl p vt =
2014-10-09 22:19:05 +00:00
(strokeTrail .
fromVertices .
flip (++) [head $ grahamGetCH vtf] .
grahamGetCH $
vtf) #
moveTo (head $ grahamGetCH vtf) #
lc red
where
vtf = filter (inRange (dX p) (dY p)) vt
2014-10-08 17:31:55 +00:00
-- |Same as showConvexHullLines, except that it returns an array
-- of diagrams with each step of the algorithm.
2014-10-09 15:20:14 +00:00
-- Unfortunately this is very difficult to implement as a Diag (TODO).
convexHullLinesInterval :: DiagProp -> [PT] -> [Diagram Cairo R2]
convexHullLinesInterval p xs =
2014-10-09 22:42:15 +00:00
fmap mkChDiag (grahamGetCHSteps xs)
2014-10-09 22:19:05 +00:00
where
2014-10-09 22:42:15 +00:00
mkChDiag vt =
2014-10-09 22:19:05 +00:00
(strokeTrail .
fromVertices $
vtf) #
moveTo (head vtf) #
lc red
where
vtf = filter (inRange (dX p) (dY p)) vt
-- |Creates a Diagram that shows an XAxis which is bound
-- by the dimensions given in xD from DiagProp.
xAxis :: Diag
2014-10-09 22:19:05 +00:00
xAxis =
(Diag hRule) `mappend`
(Diag segments) `mappend`
(Diag labels)
where
2014-10-09 22:19:05 +00:00
hRule p _ =
arrowAt (p2 (xlD p,0)) (r2 (xuD p, 0)) # moveTo (p2 (xlD p,0))
segments p _ =
2014-10-09 22:30:56 +00:00
hcat' (with & sep .~ (sqS p))
(take (floor . (/) (xuD p - xlD p) $ (sqS p)) .
repeat $ (vrule 10)) #
2014-10-09 22:19:05 +00:00
moveTo (p2 (xlD p,0))
2014-10-09 19:37:45 +00:00
labels p _ =
2014-10-09 22:19:05 +00:00
position $
zip (mkPoint <$> xs)
((\x -> (flip (<>) (square 1 # lw none) .
text . show $ x) # scale 10) <$> xs)
where
xs :: [Int]
2014-10-09 22:30:56 +00:00
xs = take (floor . (/) (xuD p - xlD p) $ (sqS p))
(iterate (+(floor . sqS $ p)) 0)
2014-10-09 22:19:05 +00:00
mkPoint x = p2 (fromIntegral x, -15)
-- |Creates a Diagram that shows an YAxis which is bound
-- by the dimensions given in yD from DiagProp.
yAxis :: Diag
2014-10-09 22:19:05 +00:00
yAxis =
(Diag vRule) `mappend`
(Diag segments) `mappend`
(Diag labels)
where
2014-10-09 22:19:05 +00:00
vRule p _ =
arrowAt (p2 (0, ylD p)) (r2 (0, yuD p)) # moveTo (p2 (0, ylD p))
segments p _ =
2014-10-09 22:30:56 +00:00
vcat' (with & sep .~ (sqS p))
(take (floor . (/) (yuD p - ylD p) $ (sqS p)) .
2014-10-09 22:19:05 +00:00
repeat $ (hrule 10)) #
alignB #
moveTo (p2 (0, (ylD p)))
2014-10-09 19:37:45 +00:00
labels p _ =
2014-10-09 22:19:05 +00:00
position $
zip (mkPoint <$> ys)
((\x -> (flip (<>) (square 1 # lw none) .
text . show $ x) # scale 10) <$> ys)
2014-10-09 19:37:45 +00:00
where
ys :: [Int]
2014-10-09 22:30:56 +00:00
ys = take (floor . (/) (yuD p - ylD p) $ (sqS p))
(iterate (+(floor . sqS $ p)) 0)
2014-10-09 19:37:45 +00:00
mkPoint y = p2 (-15, fromIntegral y)
-- |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.
whiteRectB :: Diag
2014-10-09 22:42:15 +00:00
whiteRectB = Diag rect'
where
2014-10-09 22:42:15 +00:00
rect' p _ = whiteRect (w' + 50) (h' + 50) # moveTo (p2 (w' / 2, h' / 2))
where
w' = xuD p - xlD p
h' = yuD p - ylD p
-- |Create a white rectangle with the given width and height.
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-09 22:42:15 +00:00
grid = Diag xGrid `mappend` Diag yGrid
2014-10-09 16:45:37 +00:00
where
2014-10-09 22:42:15 +00:00
yGrid p _ =
2014-10-09 22:30:56 +00:00
hcat' (with & sep .~ (sqS p))
(take (floor . (/) (xuD p - xlD p) $ (sqS p)) .
2014-10-09 22:19:05 +00:00
repeat $ (vrule $ xuD p - xlD p)) #
moveTo (p2 (xlD p, (yuD p - ylD p) / 2)) #
lw ultraThin
2014-10-09 22:42:15 +00:00
xGrid p _ =
2014-10-09 22:30:56 +00:00
vcat' (with & sep .~ (sqS p))
(take (floor . (/) (yuD p - ylD p) $ (sqS p)) .
2014-10-09 22:19:05 +00:00
repeat $ (hrule $ yuD p - ylD p)) #
alignB #
moveTo (p2 ((xuD p - xlD p) / 2, ylD p)) #
lw ultraThin