Commits on Source (86)
-
Ian Lynagh authored
-
Ian Lynagh authored
-
Ian Lynagh authored
-
Ian Lynagh authored
-
Ian Lynagh authored
-
Simon Marlow authored
-
Simon Marlow authored
-
Simon Marlow authored
-
Simon Marlow authored
-
Simon Peyton Jones authored
See Note [The kind invariant] in TypeRep Checked in CoreLint All this arises from Trac #5426
-
chak@cse.unsw.edu.au. authored
-
Ian Lynagh authored
-
Simon Marlow authored
-
Ian Lynagh authored
commit 8792391e Author: Simon Marlow <marlowsd@gmail.com> Date: Mon Dec 12 09:29:56 2011 +0000 Add a mutex around stg_sig_install Protects against a race when two threads call installHandler simultaneously. This was causing occasional failure of the test libraries/process/tests/3231(threaded2).
-
Ian Lynagh authored
-
PHO authored
* Pass -Irts/dist/build to the C preprocessor to expose libffi headers (ffi.h and ffitarget.h) to foreign import wrappers during the building process of GHC itself. * Install libffi headers into $(ghcheaderdir) just like any other C headers. Otherwise an installed GHC can't find them when it wants to compile foreign import wrappers. * Include libffi headers in the bindist for the same reason.
-
chak@cse.unsw.edu.au. authored
Although scalar functions can use any scalar data type, their arguments and functions may only involve primitive types at the moment.
-
chak@cse.unsw.edu.au. authored
-
chak@cse.unsw.edu.au. authored
-
Ian Lynagh authored
This works around the problems reported in #5539, where lots of people are running into the limit.
-
Simon Marlow authored
-
dmp authored
This commit swaps the import order of Rts.h and Stg.h in StgCRun.c for non-SPARC architectures. Swapping the import order prevents the declaration of the global registers thus allowing the GHC runtime to be compiled by LLVM-based C compilers. LLVM-base C compilers cannot use the global register declarations (for R1, R2, etc.) because they use GCC-specific extensions. The declarations are not needed in StgCRun.c except for the SPARC architecture. The other architectures use hand-written assembly that accesses the appropriate register directly.
-
Ian Lynagh authored
-
Ian Lynagh authored
And we don't build them by default, as they shouldn't go into the release.
-
tibbe authored
-
Ian Lynagh authored
-
Ian Lynagh authored
-
Ian Lynagh authored
As 7.2 was more of a technology preview, didn't go into the HP, etc, we expect most users skipped it. We therefore include its release notes in the 7.4 branch too.
-
Ian Lynagh authored
-
Simon Peyton Jones authored
-
Simon Peyton Jones authored
Such names can come from Template Haskell; see Trac #5700 Easily fixed, happily. I also renamed lookupSubBndr to lookupSubBndrOcc, which is more descriptive.
-
Simon Peyton Jones authored
We already have a class OutputableBndr; this patch adds methods pprInfixOcc and pprPrefixOcc, so that we can get rid of the hideous hack (the old) Outputable.pprHsVar. The hack was exposed by Trac #5657, which is thereby fixed.
-
Ross Paterson authored
This is quite tricky, with examples like this: import Control.Arrow pRepeat :: a -> [a] pRepeat = proc x -> do rec s <- returnA -< f_rec x:s -- f_rec is monomorphic here let f_later y = y -- f_later is polymorphic here _ <- returnA -< (f_later True, f_later 'a') let f_rec y = y -- f_rec is polymorphic here returnA -< f_later s -- f_later is monomorphic here Fixed the typechecking of arrow RecStmt to track changes to the monad version. It was simplest to add a field recS_later_rets corresponding to recS_rec_rets. It's only used for the arrow version, and always empty for the monad version. But I think it would be cleaner to put the rec_ids and later_ids in a single list with supplementary info saying how they're used. Also fixed several glitches in the desugaring of arrow RecStmt. The fact that the monomorphic variables shadow their polymorphic counterparts is a major pain. Also a bit of general cleanup of DsArrows while I was there.
-
Simon Marlow authored
-
Simon Marlow authored
Now target32bit works for all targets without any manual intervention, as it should do. #5735 was a portability regression.
-
Simon Marlow authored
It doesn't hurt to map these to ArchUnknown since we don't need to know anything specific about them, and adding them would be a pain (there are a bunch of places where we have to case-match on all the arches to avoid warnings).
-
Simon Marlow authored
Another portabilty regression: before Platform we used to use elf_OBJ_FORMAT: #if linux_TARGET_OS || freebsd_TARGET_OS || openbsd_TARGET_OS || solaris2_TARGET_OS #define elf_OBJ_FORMAT 1 #endif which defaults to undefined on unknown platforms. Defaulting to non-ELF is correct, it just means that we won't rely on ELF-specific functionality. I've added a comment to explain that.
-
Joachim Breitner authored
Fixes: #5733
-
Simon Marlow authored
-
Simon Marlow authored
-
Simon Marlow authored
We were mislabelling some foreign imports as IsData rather than IsFunction, because the type was forall a. FunPtr (... a ...). Eventually this gave rise to these obscure error when compiling unregisterised: libraries/base/Foreign/Marshal/Alloc.hc:473:0: warning: built-in function ‘free’ declared as non-function libraries/base/Foreign/Marshal/Alloc.hc:1004:0: error: ‘free’ redeclared as different kind of symbol
-
Simon Marlow authored
-
Simon Marlow authored
Instead of enterLocalIdLabel we should get the label from the ClosureInfo, because that knows better whether the label should be local or not. Needed by #5357
-
Simon Marlow authored
Needed by #5357
-
Simon Marlow authored
Needed by #5357
-
Simon Marlow authored
Needed by #5357
-
Simon Marlow authored
Needed by #5357
-
Simon Marlow authored
Needed by #5357
-
David Terei authored
-
David Terei authored
-
Simon Marlow authored
Fixes several test failures: ../../libraries/stm/tests 2411 [bad exit code] (normal,hpc,profasm,ghci,optllvm) ../../libraries/stm/tests stm046 [bad exit code] (normal,hpc,profasm,ghci,optllvm) ../../libraries/stm/tests stm061 [bad exit code] (normal,hpc,profasm,ghci,optllvm)
-
Simon Marlow authored
Don't try to print a stack trace from raiseAsync() when there's no exception - we might just be deleting the thread, or suspending duplicate work.
-
Ian Lynagh authored
-
jpm@cs.ox.ac.uk authored
Makes #5612 fail in a more civilized way, at least.
-
jpm@cs.ox.ac.uk authored
-
David Terei authored
-
David Terei authored
-
David Terei authored
-
Ian Lynagh authored
-
Ian Lynagh authored
-
Ian Lynagh authored
-
Ian Lynagh authored
-
Ian Lynagh authored
-
Ian Lynagh authored
-
Ian Lynagh authored
-
Simon Marlow authored
I haven't been able to test whether this works or not due to #5754, but at least it doesn't appear to break anything.
-
gwright@antiope.com authored
-
Ian Lynagh authored
It was removed in 4.2.
-
Ian Lynagh authored
On XCode 4.1, we use /usr/bin/gcc-4.2 as it makes better code than /usr/bin/gcc for us. However, gcc-4.2 doesn't exist in XCode 4.2, so we need to use /usr/bin/gcc there. As the installer can be used on either, we make it always use /usr/bin/gcc.
-
Ian Lynagh authored
sdist output was being redirected to $src_log, which presumably evaluated to rc_log.
-
Ian Lynagh authored
-
Simon Marlow authored
-
Simon Peyton Jones authored
There was a trivial typo which meant that important newly-added rules would never fire!
-
Ian Lynagh authored
-
Ian Lynagh authored
-
Ian Lynagh authored
We want to use the inplace ar, rather than whichever ar the machine that we build on happens to have.
-
Ian Lynagh authored
It might make more sense for there to be a way to get the "ghc --info" output with $topdir already expanded, but in the mean time this gets things working again.
-
Ian Lynagh authored
It's now ghc-<version>-testsuite.tar.bz2 rather than testsuite-ghc-<version>-src.tar.bz2 which (a) makes more sense, and (b) sorts better in directory listings.
-
Simon Marlow authored
This was a regression introduced accidentally in 6b109851. We were previously passing a large time value to select() to simulate blocking, and this broke due to a change from unsigned to signed arithmetic. I've refactored it to be less fragile now - we just pass NULL as the timeval parameter to select(), which is the correct way to do blocking.
-
Simon Peyton Jones authored
Easy fix for Trac #5742.
-
David Terei authored
-
Edward Z. Yang authored
Signed-off-by:
Edward Z. Yang <ezyang@mit.edu>
-
Simon Peyton Jones authored
Taken from Trac #5658
-
Simon Peyton Jones authored
Two changes here * The main change here is to enhance the FloatIn pass so that it can float case-bindings inwards. In particular the case bindings for array indexing. * Also change the code in Simplify, to allow a case on array indexing (ie can_fail is true) to be discarded altogether if its results are unused. Lots of new comments in PrimOp about can_fail and has_side_effects Some refactoring to share the FloatBind data structure between FloatIn and FloatOut
-
Ian Lynagh authored
commit f002a461 Author: Simon Peyton Jones <simonpj@microsoft.com> Date: Tue Jan 17 12:15:26 2012 +0000 Do not combine dictionaries in the EvVarCache when simplEqsOnly is on This fixes Trac #5776; the background is in Note [Simplifying RULE lhs constraints] in TcSimplify
-
Ian Lynagh authored
Showing
- aclocal.m4 19 additions, 14 deletionsaclocal.m4
- compiler/basicTypes/Name.lhs 3 additions, 0 deletionscompiler/basicTypes/Name.lhs
- compiler/basicTypes/RdrName.lhs 3 additions, 0 deletionscompiler/basicTypes/RdrName.lhs
- compiler/cmm/PprC.hs 3 additions, 0 deletionscompiler/cmm/PprC.hs
- compiler/codeGen/CgClosure.lhs 1 addition, 1 deletioncompiler/codeGen/CgClosure.lhs
- compiler/codeGen/CgForeignCall.hs 1 addition, 1 deletioncompiler/codeGen/CgForeignCall.hs
- compiler/codeGen/CgProf.hs 1 addition, 1 deletioncompiler/codeGen/CgProf.hs
- compiler/codeGen/ClosureInfo.lhs 4 additions, 1 deletioncompiler/codeGen/ClosureInfo.lhs
- compiler/codeGen/StgCmmForeign.hs 1 addition, 1 deletioncompiler/codeGen/StgCmmForeign.hs
- compiler/codeGen/StgCmmProf.hs 8 additions, 8 deletionscompiler/codeGen/StgCmmProf.hs
- compiler/coreSyn/CoreLint.lhs 4 additions, 39 deletionscompiler/coreSyn/CoreLint.lhs
- compiler/coreSyn/CorePrep.lhs 1 addition, 1 deletioncompiler/coreSyn/CorePrep.lhs
- compiler/coreSyn/CoreSyn.lhs 10 additions, 0 deletionscompiler/coreSyn/CoreSyn.lhs
- compiler/coreSyn/CoreUtils.lhs 30 additions, 25 deletionscompiler/coreSyn/CoreUtils.lhs
- compiler/coreSyn/MkCore.lhs 22 additions, 0 deletionscompiler/coreSyn/MkCore.lhs
- compiler/coreSyn/PprCore.lhs 3 additions, 0 deletionscompiler/coreSyn/PprCore.lhs
- compiler/deSugar/DsArrows.lhs 143 additions, 95 deletionscompiler/deSugar/DsArrows.lhs
- compiler/deSugar/DsExpr.lhs 4 additions, 4 deletionscompiler/deSugar/DsExpr.lhs
- compiler/deSugar/DsForeign.lhs 1 addition, 1 deletioncompiler/deSugar/DsForeign.lhs
- compiler/ghc.cabal.in 3 additions, 3 deletionscompiler/ghc.cabal.in