1 {-# LANGUAGE RecordWildCards, ExistentialQuantification #-}
6 Color, Rect(..), Point(..),
11 import qualified Graphics.UI.Gtk as Gtk
12 import Graphics.UI.Gtk (AttrOp(..)) -- For the := constructor
13 import qualified Graphics.Rendering.Cairo as Cairo
14 import qualified Graphics.UI.Gtk.Gdk.EventM as EventM
16 import Control.Monad.Trans -- for liftIO
18 import Control.Applicative
23 -- | A rectangle in two dimensional space
31 data Point = Point !Int !Int deriving (Show, Eq)
33 -- A color, with RGB values from 0 to 1
34 data Color = Color Double Double Double deriving (Show, Eq)
36 -- Create a Color from Red, Green and Blue values. The inputs should be
37 -- between 0 and 255 (inclusive).
38 rgb :: Int -> Int -> Int -> Color
39 rgb r g b = Color (conv r) (conv g) (conv b)
40 where conv = (/256) . fromIntegral
42 -- | Some predefined colours
46 white = rgb 0xff 0xff 0xff
48 -- | Helper functions for creating a Point
49 point, pt :: Int -> Int -> Point
54 = GfxLines Color [Point] -- coloured line through a list of points
55 | GfxPolygon Color [Point] -- filled polygon of given colour
56 | GfxPicture FilePath Point -- shows a picture
57 | GfxText Color Point String -- coloured string on position Point
58 | GfxRectangle Color Rect -- filled rectangle of given colour
59 | GfxEllipse Color Rect -- ellipse within given rectangle
60 | GfxDisc Color Rect -- filled ellipse within given rectangle
61 | GfxClear -- clears the graphical window
63 | GfxFont String Int -- changes to fontname of given size
64 | WinPrompt String String String -- pops up a window with an edit field
65 -- | WinFilePrompt Bool
66 | WinMenu [(String,[String])] -- adds a menu list to the graphical window
67 | WinTitle String -- gives a title to the graphical window
68 | FRead String -- read file with a given name
69 | FWrite String String -- writes a text file with a given filename
70 | ReqQuit -- quits the graphical system
74 = KeyIn Char -- touched key with given character
75 | MouseDoubleClick Point -- mouse event on position Point
76 | MouseDragged Point -- ibid
77 | MouseDown Point -- ibid
78 | MouseUp Point -- ibid
79 | MenuItem String String -- selected item from WinMenu with a given name
80 | PromptResponse String String String -- response to WinPrompt request
81 | FileContents String String -- response to FRead request
84 type TinaStep s = s -> Response -> (s,[Request])
85 data TinaProgram = forall s. Main
87 , initialRequests :: [Request]
88 , eventHandler :: TinaStep s
95 , initialRequests = [GfxText red (pt 0 0) "foo", GfxText blue (pt 100 100) "bar"]
96 , eventHandler = \s e -> (s+1,[GfxText green (pt 50 50) $ show (s,e)])
101 data IState = forall s. IS
102 { window :: Gtk.Window
103 , buffer :: IORef Cairo.Surface
104 , postponed :: IORef [Request]
105 , usrState :: IORef s
106 , usrProg :: TinaStep s
109 processPostponed :: IState -> IO ()
110 processPostponed s@IS {..} = do
111 ps <- readIORef postponed
112 unless (null ps) $ do
113 writeIORef postponed (tail ps)
114 rs <- handle s (head ps)
115 mapM (stepUserProgram s) rs
118 post s r = stepUserProgram s r >> processPostponed s
120 stepUserProgram :: IState -> Response -> IO ()
121 stepUserProgram IS {..} r = do
122 state <- readIORef usrState
123 let (state',reqs) = usrProg state r
124 writeIORef usrState state'
125 readIORef postponed >>= writeIORef postponed . (++ reqs)
127 handle :: IState -> Request -> IO [Response]
128 handle s@IS {..} r = do
129 resps <- maybe (fail $ "No handler for request " ++ show r) id $
130 fmap (>> return []) (gfxHandler s r <|> winHandler s r <|> miscHandler s r)
133 runTina :: TinaProgram -> IO ()
134 runTina Main {..} = do
135 usrState <- newIORef initialState
136 postponed <- newIORef (GfxText (rgb 0 0 0) (pt 50 50) "foo" : GfxClear :initialRequests)
137 let state = IS { window = undefined, buffer = undefined, usrProg = eventHandler, .. }
138 runGUI windowWidth windowHeight state
140 runGUI :: Int -> Int -> IState -> IO ()
141 runGUI w h (IS { .. }) = do
145 -- Create a window, which will make the mainloop terminated when
147 window <- Gtk.windowNew
149 Gtk.set window [ Gtk.containerBorderWidth := 10
150 , Gtk.windowTitle := "FP Practicum"
151 , Gtk.windowDefaultWidth := w
152 , Gtk.windowDefaultHeight := h
154 Gtk.onDestroy window Gtk.mainQuit
156 -- Create a buffer to draw on (name the actual buffer buffer', so we
157 -- can use IS { .. } syntax below to pack the state. Using a record update
158 -- wouldn't work, probably because Cairo.Surface contains an existential
160 -- We put the buffer in an IORef, so we can change it for a new one
161 -- later on (on window resizes).
162 buffer' <- Cairo.createImageSurface Cairo.FormatARGB32 w h
163 buffer <- newIORef buffer'
166 Gtk.on window Gtk.exposeEvent $ onExpose buffer
167 Gtk.on window Gtk.configureEvent $ onResize buffer
170 let state = IS { .. }
172 -- Process any initial requests
173 processPostponed state
175 -- Show the window and start the Gtk mainloop.
176 Gtk.widgetShowAll window
180 -- | Copy the given surface to the exposed window on an expose event.
181 onExpose :: IORef Cairo.Surface -> EventM.EventM EventM.EExpose Bool
183 current_buffer <- liftIO $ readIORef buffer
184 dw <- EventM.eventWindow
185 -- Copy the buffer to the window
186 liftIO $ Gtk.renderWithDrawable dw $ do
187 Cairo.setSourceSurface current_buffer 0 0
189 return True -- No clue what this means
191 -- | Called when the window is resized. Resize the given buffer if needed.
192 onResize :: IORef Cairo.Surface -> EventM.EventM EventM.EConfigure Bool
194 -- Get the current buffer and see if it's still big enough
195 current_buffer <- liftIO $ readIORef buffer
196 sw <- Cairo.imageSurfaceGetWidth current_buffer
197 sh <- Cairo.imageSurfaceGetHeight current_buffer
198 -- Get the current drawwindow and its size
199 dw <- EventM.eventWindow
200 (w, h) <- liftIO $ Gtk.drawableGetSize dw
201 when (w > sw || h > sh) $ liftIO $ do
202 -- Buffer is too small, expand it.
203 new_buffer <- Cairo.createImageSurface Cairo.FormatARGB32 w h
204 -- Fill it with white and copy the old buffer
205 Cairo.renderWith new_buffer $ do
206 Cairo.setSourceRGB 1 1 1
208 Cairo.setSourceSurface current_buffer 0 0
210 -- Clean up the old buffer
211 Cairo.surfaceFinish current_buffer
212 -- Store and return the new buffer
213 writeIORef buffer new_buffer
214 return True -- No clue what this means
218 runGUI s IS {..} = do
220 [ text := "FP Practicum"
223 buffer <- memoryDCCreate
224 bitmapCreateEmpty s 24 >>= memoryDCSelectObject buffer
225 withBrushStyle (BrushStyle BrushSolid white) (dcSetBackground buffer)
228 [ fontFace := "Courier New"
230 , brushColor := rgb 0 0 0
231 , brushKind := BrushSolid
232 , penColor := rgb 0 0 0
233 , penKind := PenSolid
235 sPanel <- panel sFrame [ size := s ]
238 [ on paint := onPaint state
239 , on doubleClick := post state . MouseDoubleClick
240 , on click := post state . MouseDown
241 , on drag := post state . MouseDragged
242 , on unclick := post state . MouseUp
243 , on anyKey := transKey (post state . KeyIn)
246 [ on closing := sFrame `set` [ visible := False ] >> wxcAppExit
247 , on anyKey := transKey (post state . KeyIn)
248 , layout := widget sPanel
250 windowSetFocus sFrame
251 processPostponed state
252 onPaint :: IState -> DC a -> Rect -> IO ()
253 onPaint IS {..} dest va = do
254 dcBlit dest va buffer (Point 0 0) wxCOPY False >> return ()
256 transKey :: (Char -> IO ()) -> Key -> IO ()
257 transKey prod (KeyChar c) = prod c
258 transKey prod KeySpace = prod ' '
259 transKey prod KeyEscape = prod '\ESC'
260 transKey prod KeyReturn = prod '\n'
261 transKey prod KeyTab = prod '\t'
262 transKey _ _ = return ()
266 -- | Handlers for various requests.
267 miscHandler, winHandler, gfxHandler :: IState -> Request -> Maybe (IO ())
269 miscHandler s@IS {..} (FRead fn ) = Just $ readFile fn >>= post s . FileContents fn
270 miscHandler IS {..} (FWrite fn cnts) = Just $ writeFile fn cnts
271 miscHandler IS {..} ReqQuit = Just $ putStrLn "Quiting" >> wxcAppExit
273 miscHandler IS {..} _ = Nothing
276 winHandler s@IS {..} (WinPrompt st1 st2 st3) = Just $ textDialog sFrame st1 st2 st3 >>= post s . PromptResponse st1 st2
277 winHandler IS {..} (WinTitle st) = Just $ sFrame `set` [text := st]
278 winHandler s@IS {..} (WinMenu ms) = Just $ mkMenu >>= \ms' -> sFrame `set` [menuBar := ms']
282 p <- menuPane [ text := name ]
285 i <- menuItem p [ text := item ]
286 sFrame `set` [on (menu i) := post s (MenuItem name item)]
289 | (name,items) <- ms ]
291 winHandler _ _ = Nothing
293 gfxHandler s req = case gfxHandler' req of
295 Just render -> Just $ do
296 buf <- readIORef (buffer s)
297 Cairo.renderWith buf render
298 Gtk.widgetQueueDraw (window s)
301 gfxHandler IS {..} (GfxLines col ps) = Just $ polyline buffer ps [penColor := col] >> dirtyPts sPanel ps
302 gfxHandler IS {..} (GfxPolygon col ps) = Just $ polygon buffer ps [penColor := col, brushColor := col] >> dirtyPts sPanel ps
303 gfxHandler IS {..} (GfxText col xy st) = Just $ drawText buffer st xy [textColor := col] >> getTextExtent buffer st >>= dirtyRect' sPanel xy
304 gfxHandler IS {..} (GfxRectangle col rt) = Just $ drawRect buffer rt [penColor := col, brushColor := col] >> dirtyRect sPanel rt
305 gfxHandler IS {..} (GfxEllipse col rt) = Just $ ellipse buffer rt [penColor := col, brushKind := BrushTransparent] >> dirtyRect sPanel rt
306 gfxHandler IS {..} (GfxDisc col rt) = Just $ ellipse buffer rt [penColor := col, brushColor := col] >> dirtyRect sPanel rt
307 gfxHandler IS {..} (GfxFont st sz) = Just $ buffer `set` [ fontSize := sz, fontFace := st ]
308 gfxHandler IS {..} (GfxPicture fd pt) = Just $ bitmapCreateFromFile fd >>= \bm -> drawBitmap buffer bm pt False [] >> bitmapGetSize bm >>= dirtyRect' sPanel pt
310 -- | Helper function for gfxHanlder
311 gfxHandler' :: Request -> Maybe (Cairo.Render ())
312 gfxHandler' (GfxText col (Point x y) st) = Just $ do
313 -- Set the source color, move to the requested position and draw the
316 Cairo.moveTo (fromIntegral x) (fromIntegral y)
318 gfxHandler' GfxClear = Just $ do
319 -- Set the source to white and paint the entire surface with it
320 Cairo.setSourceRGB 1 1 1
322 gfxHandler' _ = Nothing
324 -- | Sets the source to a pattern fill of the given color
325 setSourceColor :: Color -> Cairo.Render ()
326 setSourceColor (Color r g b) =
327 Cairo.setSourceRGB r g b
330 dirtyPts :: Window a -> [Point] -> IO ()
331 dirtyPts dc ps = dirtyRect' dc (pt x y) Size {..}
337 sizeW = maximum xs - x
338 sizeH = maximum ys - y
340 dirtyRect' :: Window a -> Point -> Size -> IO ()
341 dirtyRect' dc Point {..} Size {..} = dirtyRect dc $ Rect pointX pointY sizeW sizeH
343 dirtyRect :: Window a -> Rect -> IO ()
344 dirtyRect dc rect = windowRefreshRect dc False (grow 2 rect)
346 rectanglify :: Point -> Size -> Rect
347 rectanglify Point {..} Size {..} = Rect pointX pointY sizeW sizeH
349 grow :: Int -> Rect -> Rect
350 grow n Rect {..} = Rect
351 { rectLeft = rectLeft - n
352 , rectTop = rectTop - n
353 , rectWidth = rectWidth + 2 * n
354 , rectHeight = rectHeight + 2 * n }