
#7718: ios patch no 8: adjustor pools
--------------------------------+-------------------------------------------
Reporter: StephenBlackheath | Owner:
Type: feature request | Status: patch
Priority: normal | Milestone:
Component: Compiler | Version: 7.7
Resolution: | Keywords:
Os: Other | Architecture: arm
Failure: None/Unknown | Difficulty: Unknown
Testcase: | Blockedby:
Blocking: 7724 | Related:
--------------------------------+-------------------------------------------
Comment(by StephenBlackheath):
I forgot to mention that I re-tested this patch on Linux to make sure my
refactoring didn't break it:
{{{
{-# LANGUAGE ForeignFunctionInterface #-}
import Foreign
import Foreign.C
foreign import ccall "wrapper" wrap :: (CInt -> IO CInt) -> IO (FunPtr
(CInt -> IO CInt))
foreign import ccall safe "callme" callme :: (FunPtr (CInt -> IO CInt)) ->
IO ()
main = do
putStrLn "hi"
f <- wrap $ \i -> do
putStrLn $ "haskell got "++show i
return $ i + 1
callme f
freeHaskellFunPtr f
putStrLn "bye"
}}}
{{{
#include