Skip to content
Snippets Groups Projects
Commit 45acf865 authored by Simon Marlow's avatar Simon Marlow
Browse files

[project @ 1997-11-12 10:59:10 by simonm]

duplicate test
parent 4dd68859
No related merge requests found
--!!! cc001 -- ccall with standard boxed arguments and results
module Test where
import GlaExts
-- simple functions
a :: PrimIO Int
a = _ccall_ a
b :: Int -> PrimIO Int
b x = _ccall_ b x
c :: Int -> Char -> Float -> Double -> PrimIO Float
c x1 x2 x3 x4 = _ccall_ c x1 x2 x3 x4
-- simple monadic code
d = a `thenPrimIO` \ x ->
b x `thenPrimIO` \ y ->
c y 'f' 1.0 2.0
ghc: module version changed to 1; reason: no old .hi file
0% Loading or .
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment