[Haskell-cafe] Unknown symbol `__dso_handle' with Template Haskell and wxHaskell

Alexander Bau abau at imn.htwk-leipzig.de
Sat Dec 25 18:41:22 CET 2010


Hi,

I am using Template Haskell and wxHaskell [1]. When Graphics.UI.WX is
loaded during THs code generation, I get the following error:

> ...
> Loading package wxdirect-0.12.1.3 ... linking ... done.
> ghc: /usr/local/lib/wxcore-0.12.1.6/ghc-6.12.3/HSwxcore-0.12.1.6.o:
> unknown symbol `__dso_handle' 
> Loading package wxcore-0.12.1.6 ...
> linking ... ghc: unable to load package `wxcore-0.12.1.6'

System stats:
ghc-6.12.3
template-haskell-2.4.0.1
wx-0.12.1.6

Regards,

Alex

[1] Example:

-- Test.hs ----------------------

{-# LANGUAGE TemplateHaskell #-}
module Test2 where

import Language.Haskell.TH
import qualified Graphics.UI.WX as WX

foo :: Q [Dec]
foo = do
  info <- reify ''WX.Color
  runIO $ print info
  return []

-- Main.hs ----------------------

{-# LANGUAGE TemplateHaskell #-}
module Main where

import Test

$(foo)




More information about the Haskell-Cafe mailing list