Link error is:
[EMAIL PROTECTED] test]$ ghc c.hs
c.o: In function `rM7_info':
(.text+0xaa): undefined reference to
`containerszm0zi1zi0zi0_DataziMap_lookup_closure'
c.o: In function `rMd_info':
(.text+0x1fa): undefined reference to
`containerszm0zi1zi0zi0_DataziMap_fromList_closure'
c.o: In function `sVJ_info':
(.text+0xa3b): undefined reference to
`__stginit_containerszm0zi1zi0zi0_DataziMap_'
c.o: In function `rM7_srt':
(.data+0x18): undefined reference to
`containerszm0zi1zi0zi0_DataziMap_lookup_closure'
c.o: In function `rMd_srt':
(.data+0x60): undefined reference to
`containerszm0zi1zi0zi0_DataziMap_fromList_closure'
collect2: ld returned 1 exit status
module Main where
 
import qualified Data.Map as M
 
errorsPerLine = M.fromList
    [ ("Chris", 472), ("Don", 100), ("Simon", -5) ]
 
main = do putStrLn "Who are you?"
          name <- getLine
          case M.lookup name errorsPerLine of
              Nothing -> putStrLn "I don't know you"
              Just n  -> do putStr "Errors per line: "
                            print n

_______________________________________________
Haskell mailing list
[email protected]
http://www.haskell.org/mailman/listinfo/haskell

Reply via email to