Difference between revisions of "Gtk2Hs/Tutorials/TreeView"

From HaskellWiki
Jump to navigation Jump to search
m
m
Line 5: Line 5:
 
module Main where
 
module Main where
   
an example how to select from a list
+
{- an example how to select from a list
 
not satisfactory yet:
 
not satisfactory yet:
 
- there should be a simpler way to render a simple list
 
- there should be a simpler way to render a simple list
Line 21: Line 21:
   
 
import Graphics.UI.Gtk
 
import Graphics.UI.Gtk
 
 
import Graphics.UI.Gtk.ModelView as Model
 
import Graphics.UI.Gtk.ModelView as Model
   
   
 
main :: IO ()
 
main :: IO ()
 
 
main = do
 
main = do
 
initGUI -- is start
 
initGUI -- is start
 
window <- windowNew
 
window <- windowNew
  +
 
list <- listStoreNew ["Vince", "Jhen", "Chris", "Sharon"]
 
list <- listStoreNew ["Vince", "Jhen", "Chris", "Sharon"]
  +
 
treeview <- Model.treeViewNewWithModel list
 
treeview <- Model.treeViewNewWithModel list
 
Model.treeViewSetHeadersVisible treeview True
 
Model.treeViewSetHeadersVisible treeview True
  +
-- there should be a simpler way to render a list!
+
-- there should be a simpler way to render a list as the following!
 
col <- Model.treeViewColumnNew
 
col <- Model.treeViewColumnNew
 
Model.treeViewColumnSetTitle col "colTitle"
 
Model.treeViewColumnSetTitle col "colTitle"
Line 60: Line 61:
 
sel <- Model.treeSelectionGetSelectedRows tree
 
sel <- Model.treeSelectionGetSelectedRows tree
 
let s = head (head sel)
 
let s = head (head sel)
tree <- Model.treeSelectionGetTreeView tree
 
 
v <- Model.listStoreGetValue list s
 
v <- Model.listStoreGetValue list s
 
putStrLn $ "selected " ++ v
 
putStrLn $ "selected " ++ v

Revision as of 09:23, 1 September 2009

I had much trouble with creating a simple selection from a list, lacking examples on the web i could find. Therefore i post here the solution I have working - it is not optimal and I would appreciate comments. I shows a simple list with four names and after clicking on one it says which one you selected. i hope it is useful for others!


module Main where
 {- an example how to select from a list
   not satisfactory yet:
       - there should be a simpler way to render a simple list
       - i could not convert the model i got back to a list 
           from which to get the value
       
       - the interface offers a great number of functions 
           and it is very difficult to find which ones are 
           really needed for simple tasks
       


-}


import Graphics.UI.Gtk
import Graphics.UI.Gtk.ModelView as Model


main :: IO ()
main = do
   initGUI       -- is start
   window <- windowNew
   list <- listStoreNew ["Vince", "Jhen", "Chris", "Sharon"]
   treeview <- Model.treeViewNewWithModel list
   Model.treeViewSetHeadersVisible treeview True
           -- there should be a simpler way to render a list as the following!
   col <- Model.treeViewColumnNew
   Model.treeViewColumnSetTitle col "colTitle"
   renderer <- Model.cellRendererTextNew
   Model.cellLayoutPackStart col renderer False
   Model.cellLayoutSetAttributes col renderer list
           $ \ind -> [Model.cellText := ind]
   Model.treeViewAppendColumn treeview col
   tree <- Model.treeViewGetSelection treeview
   Model.treeSelectionSetMode tree  SelectionSingle
   Model.onSelectionChanged tree (oneSelection list tree)
   set window [ windowDefaultWidth := 100
               , windowDefaultHeight := 200
               , containerChild := treeview
              ]
   onDestroy window mainQuit
   widgetShowAll window
   mainGUI
   return ()
oneSelection :: ListStore String -> Model.TreeSelection ->  IO ()
oneSelection list tree = do
   sel <- Model.treeSelectionGetSelectedRows tree
   let s = head  (head sel)
   v <- Model.listStoreGetValue list s
   putStrLn $ "selected " ++ v