- 20 Jun, 2015 1 commit
-
-
Sergei Trofimovich authored
Signed-off-by:
Sergei Trofimovich <siarheit@google.com>
-
- 19 Jun, 2015 4 commits
-
-
Sergei Trofimovich authored
Test sets allocation limit for a current main thread, ghci already loaded a bunch of stuff in it. Signed-off-by:
Sergei Trofimovich <siarheit@google.com>
-
pali.gabor@gmail.com authored
dblatex can only translate the Unicode glyphs introduced in #10509 for LaTeX if the `latex.unicode.use=1` flag is set, otherwise it will just fail. However, note that adding this flag is not going to fully solve the problem as those symbols are not known by LaTeX, so the corresponding character codes will be added instead to the resulting PS/PDF files. Hence it is considered an interim solution only, not a true fix, until a better one is found.
-
Austin Seipp authored
This was working, and then it started failing again; it's a pretty fragile test anyway because it 'grep's the output of the compiler. In the mean time, make the CI system quiet down by marking it appropriately. Signed-off-by:
Austin Seipp <austin@well-typed.com>
-
Gabor Greif authored
-
- 18 Jun, 2015 12 commits
-
-
Simon Peyton Jones authored
-
Simon Peyton Jones authored
-
Alan Zimmerman authored
Summary: Parsing {-# LANGUAGE TupleSections #-} baz = (1, "hello", 6.5,,) 'a' (Just ()) Results in the following AST fragment (L tests/examples/Tuple.hs:3:7-25 (ExplicitTuple [ L tests/examples/Tuple.hs:3:8 (Present (L tests/examples/Tuple.hs:3:8 (HsOverLit (OverLit (HsIntegral [ '1' ] 1) PlaceHolder (HsLit (HsString [] {abstract:FastString})) PlaceHolder)))) , L tests/examples/Tuple.hs:3:11-17 (Present (L tests/examples/Tuple.hs:3:11-17 (HsLit (HsString [ '"' , 'h' , 'e' , 'l' , 'l' , 'o' , '"' ] {abstract:FastString})))) , L tests/examples/Tuple.hs:3:20-22 (Present (L tests/examples/Tuple.hs:3:20-22 (HsOverLit (OverLit (HsFractional (FL [ '6' , '.' , '5' ] (:% 13 2))) PlaceHolder (HsLit (HsString [] {abstract:FastString})) PlaceHolder)))) , L tests/examples/Tuple.hs:3:24 (Missing PlaceHolder) , L tests/examples/Tuple.hs:3:24 (Missing PlaceHolder) ] The final `Missing PlaceHolder` has a duplicated `SrcSpan` Test Plan: ./validate Reviewers: austin, hvr, bgamari Reviewed By: bgamari Subscribers: thomie, bgamari, mpickering Differential Revision: https://phabricator.haskell.org/D995 GHC Trac Issues: #10537
-
Simon Peyton Jones authored
This test greps in the ouput of -ddump-simpl, so it's fragile. It stopped working for a while, but now works again. I don't know why, but I don't have time to investigate, so I'll just mark it as ok.
-
Simon Peyton Jones authored
This splits filterAlts into two: - filterAlts - refineDefaultAlt No change in functionality
-
Simon Peyton Jones authored
-
Simon Peyton Jones authored
-
Simon Peyton Jones authored
I just didn't think it was buying enough for all the cruft it caused. We can put some back if people start complaining about poor error messages. I forget quite how I tripped over this but I got sucked in. * Lots of tidying up in TcErrors * Rename pprArisingAt to pprCtLoc, by analogy with pprCtOrigin * Remove CoercibleOrigin data constructor from CtOrigin * Make relevantBindings return a Ct with a zonked and tidied CtOrigin * Add to TcRnTypes ctOrigin :: Ct -> CtOrigin ctEvOrigin :: CtEvidence -> CtOrigin setCtLoc :: Ct -> CtLoc -> Ct
-
Simon Peyton Jones authored
getCtLoc -> getCtLocM setCtLoc -> setCtLocM These operations are monadic, and I want to introduce a pure version of setCtLoc :: Ct -> CtLoc -> Ct
-
Simon Peyton Jones authored
Rewording in Note [Decomposing equality] Note [Decomposing newtypes at representational role] Richard you may want to check, but I think it's fine.
-
Simon Peyton Jones authored
Trac #10516 pointed out that when reporting arity errors (like "T needs 2 arguments but has been given 1"), we should not count kind arguments, since they are implicit. If we include kind args in the count, we get very confusing error messages indeed. I did a little bit of refactoring which make some error messages wobble around. But the payload of this fix is in TcValidity.tyConArityErr
-
Simon Peyton Jones authored
This was a nasty, long-standing bug exposed in Trac #10538. Symptoms were that we had an empty case case (x :: Either a) of {} Core Lint correctly picked this bogus code up. Here is what happened * In SimplUtils.prepareAlts, we call filterAlts then combineIdenticalAlts * We had case x of { Left _ -> e1; Right _ -> e1 } * filterAlts did nothing, but correctly retuned imposs_deflt_cons saying that 'x' cannot be {Left, Right} in the DEFAULT branch, if any (there isn't one.) * combineIdentialAlts correctly combines the identical alts, to give case x of { DEFAULT -> e1 } * BUT combineIdenticalAlts did no adjust imposs_deft_cons * Result: when compiling e1 we did so in the belief that 'x' could not be {Left,Right}. Disaster. Easily fixed. (It is hard to trigger; I can't construct a simple test case.)
-
- 16 Jun, 2015 23 commits
-
-
rwbarton authored
... by entirely replacing the use of CPP by a custom preprocessor; clang -E -traditional has no stringification mechanism at all. Reviewed By: thomie, austin Differential Revision: https://phabricator.haskell.org/D957 GHC Trac Issues: #9399
-
Edward Z. Yang authored
Signed-off-by:
Edward Z. Yang <ezyang@cs.stanford.edu> Reviewed By: rwbarton, austin Differential Revision: https://phabricator.haskell.org/D951 GHC Trac Issues: #10467
-
Thomas Miedema authored
See Note [writeAtomic leaky abstraction]. GHC on Linux already received a patch for this bug in e0801a0f. On Windows several cabal tests were hitting the bug, causing validate failures, but we never noticed because of all the other tests that were failing on Windows. And it didn't start happening till `getModificationTime` received sub-second resolution support on Windows in 5cf76186. Since there are regression tests already, I am not adding another one. But for good measure, here is a script that shows the bug without needing to do a full validate run: DB=/tmp/package.conf.d.test GHC_PKG=ghc-pkg #utils/ghc-pkg/dist/build/tmp/ghc-pkg LOCAL_GHC_PKG="${GHC_PKG} --no-user-package-db --global-package-db=${DB}" while true; do rm -rf ${DB} ${LOCAL_GHC_PKG} init "${DB}" ${LOCAL_GHC_PKG} list done If you see "WARNING: cache is out of date" after a few seconds, the bug is not fixed. Reviewed By: austin Differential Revision: https://phabricator.haskell.org/D990 GHC Trac Issues: #10205
-
Gabriella439 authored
See original proposal at https://mail.haskell.org/pipermail/libraries/2014-November/024310.html for more details Reviewed By: hvr, austin Differential Revision: https://phabricator.haskell.org/D988 GHC Trac Issues: #10523
-
eir@cis.upenn.edu authored
-
eir@cis.upenn.edu authored
-
eir@cis.upenn.edu authored
Custom treatment of FunTys in can_eq_nc' interfered with the new handling of decomposing equalities.
-
eir@cis.upenn.edu authored
Because typesCantMatch must also work with type functions, this requires teaching the unifier about type functions and injectivity. Also, some refactoring to use the UM monad more.
-
eir@cis.upenn.edu authored
This adds the significant Note [Decomposing equalities] to TcCanonical, trying to sort out the various cases involved. The only functional change this commit should make is a different treatment of data families, which were wrong before (they could be decomposed at role R, which is wrong).
-
eir@cis.upenn.edu authored
This is actually an improvement. Yay!
-
eir@cis.upenn.edu authored
The one non-comment change is a small refactoring/simplification in TcCanonical that should have no impact: avoiding flattening twice.
-
eir@cis.upenn.edu authored
This is pursuant to a conversion with SPJ, where we agreed that the logic behind Note [Instance and Given overlap] in TcInteract applied to newtype decomposition for representational equality. There is no bug report or test case, as tickling this kind of thing is quite hard to do!
-
eir@cis.upenn.edu authored
-
eir@cis.upenn.edu authored
Now, a Coercible (T1 ...) (T2 ...) constraint is insoluble only when both T1 and T2 say "yes" to isDistinctTyCon. Several comments also updated in this patch.
-
eir@cis.upenn.edu authored
This change means that the intricate reasoning in TcErrors around getting messages just right for nominal equalities is skipped for representational equalities.
-
eir@cis.upenn.edu authored
Now representational AppTys are just IrredEvCans, as they should be. Test case: typecheck/should_compile/T10494
-
Ben Gamari authored
Summary: Alignment needs to be a compile-time constant. Previously the code generators had to jump through hoops to ensure this was the case as the alignment was passed as a CmmExpr in the arguments list. Now we take care of this up front. This fixes #8131. Authored-by:
Reid Barton <rwbarton@gmail.com> Dusted-off-by:
Ben Gamari <ben@smart-cactus.org> Tests for T8131 Test Plan: Validate Reviewers: rwbarton, austin Reviewed By: rwbarton, austin Subscribers: bgamari, carter, thomie Differential Revision: https://phabricator.haskell.org/D624 GHC Trac Issues: #8131
-
Summary: Alignment needs to be a compile-time constant. Previously the code generators had to jump through hoops to ensure this was the case as the alignment was passed as a CmmExpr in the arguments list. Now we take care of this up front. This fixes #8131. Authored-by:
Reid Barton <rwbarton@gmail.com> Dusted-off-by:
Ben Gamari <ben@smart-cactus.org> Tests for T8131 Test Plan: Validate Reviewers: rwbarton, austin Reviewed By: rwbarton, austin Subscribers: bgamari, carter, thomie Differential Revision: https://phabricator.haskell.org/D624 GHC Trac Issues: #8131
-
Ben Gamari authored
Summary: Today when reading through the users manual I noticed a few spelling issues. This prompted me to run the document through ispell which turned up even more issues. I've tried to be conservative here; most of the corrections are misspellings and typos but in a few cases I've moved from American to British orthography. Test Plan: Read. Reviewers: austin Reviewed By: austin Subscribers: bgamari, thomie Differential Revision: https://phabricator.haskell.org/D925
-
Summary: Today when reading through the users manual I noticed a few spelling issues. This prompted me to run the document through ispell which turned up even more issues. I've tried to be conservative here; most of the corrections are misspellings and typos but in a few cases I've moved from American to British orthography. Test Plan: Read. Reviewers: austin Reviewed By: austin Subscribers: bgamari, thomie Differential Revision: https://phabricator.haskell.org/D925
-
Ben Gamari authored
Summary: I've heard numerous fledgling Haskeller's complain about the behavior of ghci regarding bindings. While most REPLs accept bindings of the form `x = 42`, GHCi is implicitly a `do` block, meaning that the user must know to use a `let` to introduce a binding. Here we suggest to the user that they may need a `let` and give them a small example in the event that we find an unexpected `=` token. Reviewers: austin Reviewed By: austin Subscribers: thomie, bgamari Differential Revision: https://phabricator.haskell.org/D980
-
Summary: I've heard numerous fledgling Haskeller's complain about the behavior of ghci regarding bindings. While most REPLs accept bindings of the form `x = 42`, GHCi is implicitly a `do` block, meaning that the user must know to use a `let` to introduce a binding. Here we suggest to the user that they may need a `let` and give them a small example in the event that we find an unexpected `=` token. Reviewers: austin Reviewed By: austin Subscribers: thomie, bgamari Differential Revision: https://phabricator.haskell.org/D980
-
-auto-all is now -fprof-auto. Reviewed By: austin Differential Revision: https://phabricator.haskell.org/D989
-