You should maybe delete your pre cabal 1.18 ~/.cabal/config file and run cabal update then merge back any important settings. I think cabal 1.18 by default builds everything with dynamic-too
On Thursday, January 2, 2014, Yorick Laupa wrote: > Except expected #7021 error message, it works on my machine (Archlinux > x86_64) with --dynamic-too > > > 2014/1/2 Carter Schonwald <[email protected] <javascript:_e({}, > 'cvml', '[email protected]');>> > >> would --dynamic-too work too? >> >> >> On Thu, Jan 2, 2014 at 5:36 PM, Yorick Laupa >> <[email protected]<javascript:_e({}, 'cvml', '[email protected]');> >> > wrote: >> >>> Hi Carter, >>> >>> Someone figured it out on #ghc. It seems we need to compile with >>> -dynamic when having TH code now ( >>> https://ghc.haskell.org/trac/ghc/ticket/8180) >>> >>> About a snippet, I working on that ticket ( >>> https://ghc.haskell.org/trac/ghc/ticket/7021) so it's based on the >>> given sample: >>> >>> -- Tuple.hs >>> {-# LANGUAGE ConstraintKinds, TemplateHaskell #-} >>> >>> module Tuple where >>> >>> import Language.Haskell.TH >>> >>> type IOable a = (Show a, Read a) >>> >>> foo :: IOable a => a >>> foo = undefined >>> >>> test :: Q Exp >>> test = do >>> Just fooName <- lookupValueName "foo" >>> info <- reify fooName >>> runIO $ print info >>> [| \_ -> 0 |] >>> -- >>> >>> -- Main.hs >>> {-# LANGUAGE TemplateHaskell #-} >>> module Main where >>> >>> import Tuple >>> >>> func :: a -> Int >>> func = $(test) >>> >>> main :: IO () >>> main = print "hello" >>> >>> -- >>> >>> >>> 2014/1/2 Carter Schonwald <[email protected]<javascript:_e({}, >>> 'cvml', '[email protected]');> >>> > >>> >>>> Did you build ghc with both static and dynamic libs? Starting in >>>> 7.7/HEAD, ghci uses Dylib versions of libraries, and thus TH does too. >>>> What OS and architecture is this, and what commit is your ghc build from? >>>> >>>> Last but most importantly, if you don't share the code, we can't really >>>> help isolate the problem. >>>> >>>> >>>> On Thursday, January 2, 2014, Yorick Laupa wrote: >>>> >>>>> Hi, >>>>> >>>>> Oddly I can't compile code using TH with GHC HEAD. Here's what I get: >>>>> >>>>> cannot find normal object file ‛./Tuple.dyn_o’ >>>>> while linking an interpreted expression >>>>> >>>>> I'm currently working on a issue so I compile the code with ghc-stage2 >>>>> for convenience. >>>>> >>>>> I found an old ticket related to my problem ( >>>>> https://ghc.haskell.org/trac/ghc/ticket/8443) but adding >>>>> -XTemplateHaskell didn't work out. >>>>> >>>>> The code compiles with ghc 7.6.3. >>>>> >>>>> Here's my setup: Archlinux (3.12.6-1) >>>>> >>>>> Any suggestions ? >>>>> >>>>> --Yorick >>>>> >>>>> >>> >> >
_______________________________________________ ghc-devs mailing list [email protected] http://www.haskell.org/mailman/listinfo/ghc-devs
