
24 Jan
2013
24 Jan
'13
10:44 a.m.
I tried it here with android. It works, no segfault. I have used llvm-3.2, maybe that helps? On 01/24/2013 03:44 PM, Stephen Paul Weber wrote:
I just got my unregistered LLVM-based ARM cross-compiler to a working place, which means I can produce any binaries which do no crash. Yay!
However, http://hackage.haskell.org/trac/ghc/ticket/7621 when I try to use FunPtr wrappers, something smashes the stack.
Would others working on ARM cross-compilers be willing to try this test and see if it works for you:
{-# LANGUAGE ForeignFunctionInterface #-} module Main (main) where
import Foreign.Ptr
foreign import ccall "wrapper" wrap_refresh :: ( IO ()) -> IO (FunPtr ( IO ()))
main :: IO () main = do wrap_refresh (return ()) return ()