May 2017 Archives by thread
Starting: Mon May 1 00:00:14 UTC 2017
Ending: Wed May 31 19:43:12 UTC 2017
Messages: 1203
- [GHC] #13586: ghc --make seems to leak memory
GHC
- [GHC] #10675: GHC does not check the functional dependency consistency condition correctly
GHC
- [GHC] #13604: ghci no longer loads dynamic .o files by default if they were built with -O (was: regression in ghc 8.2.1-rc1 (8.2.0.20170404))
GHC
- [GHC] #13608: Expose the type of quasiquotes
GHC
- [GHC] #13577: Compiler performance on open-symbology parser module regressed in GHC 8.2
GHC
- [GHC] #13622: Regression: can't export constructor when conflicting, qualified constructor is also in scope
GHC
- [GHC] #13632: Frontend plugin arguments are reversed
GHC
- [GHC] #11295: Figure out what LLVM passes are fruitful
GHC
- [GHC] #10074: Implement the 'Improved LLVM Backend' proposal
GHC
- [GHC] #13624: loadObj() does not respect alignment
GHC
- [GHC] #13609: regression: `ANN` pragmas no longer ignored in TH-less GHC 8.2.1
GHC
- [GHC] #13378: LLVM backend doesn't support MacOS dead code stripping (was: ghc-stage2 broken for quick-llvm)
GHC
- [GHC] #13564: Why does memory usage increase so much during CoreTidy?
GHC
- [GHC] #13623: join points produce bad code for stream fusion
GHC
- [GHC] #13633: testwsdeque failure on POWER8
GHC
- [GHC] #13634: num009 fails on POWER8
GHC
- [GHC] #13635: Incorrect result at runtime with list comprehensions in that case
GHC
- [GHC] #13636: Enable -Wcpp-undef
GHC
- [GHC] #13429: Optimizer produces Core with an infinite <<loop>>
GHC
- [GHC] #13310: Cut a new array release
GHC
- [GHC] #8443: cannot find normal object file when compiling TH code
GHC
- [GHC] #12075: Fails to build on powerpcspe because of inline assembly
GHC
- [GHC] #2893: Implement "Quantified contexts" proposal
GHC
- Re: [GHC] #13615: Nondeterminism in ‘pure’ function w/ parallel evaluation & memo combinators
GHC
- [GHC] #9630: compile-time performance regression (probably due to Generics)
GHC
- [GHC] #13515: Unexpected failure of T11223_simple_duplicate_lib on 32-bit Windows
GHC
- [GHC] #11371: Bogus in-scope set in substitutions
GHC
- [GHC] #11959: Importing doubly exported pattern synonym and associated pattern synonym panics
GHC
- [GHC] #13585: ala from Control.Lens.Wrapped panics
GHC
- [GHC] #12913: Port SplitSections to Windows
GHC
- [GHC] #13220: Performance regressions in testsuite from join points
GHC
- [GHC] #13379: Space leak / quadratic behavior when inlining
GHC
- [GHC] #13637: Printing type operators adds extraneous parenthesis
GHC
- [GHC] #13638: configure error: GHC is required.
GHC
- [GHC] #13594: Typechecker behavior w.r.t. BangPatterns and nested foralls has changed in 8.2
GHC
- [GHC] #11222: Teach strictness analysis about `catch`-like operations
GHC
- [GHC] #13002: :set -O does not work in .ghci file
GHC
- [GHC] #13075: Top-level bang pattern accepted
GHC
- [GHC] #13357: Check demand signatures for catchRetry# and catchSTM#
GHC
- [GHC] #13481: T12622 fails in ghci way
GHC
- [GHC] #13426: compile-time memory-usage regression for DynFlags between GHC 8.0 and GHC 8.2
GHC
- [GHC] #13639: Skylighting package compilation is glacial
GHC
- [GHC] #10230: multiline literals doesn't work with CPP extension.
GHC
- [GHC] #13320: Unfortunate compiler loop when creating type loop (with UndecidableInstances)
GHC
- [GHC] #13640: Core lint error with deferred type holes
GHC
- [GHC] #13233: typePrimRep panic while compiling GHC with profiling
GHC
- [GHC] #13333: Typeable regression in GHC HEAD
GHC
- [GHC] #13641: Compile error while performing stack upgrade
GHC
- [GHC] #13578: Incorrect Record Pattern Synonym example in users guide
GHC
- [GHC] #12947: Core lint error
GHC
- [GHC] #11669: Incorrectly suggests RankNTypes for ill-formed type "forall a. Eq a. Int"
GHC
- [GHC] #11616: Kinds aren't instantiated
GHC
- [GHC] #11333: GHCi does not discharge satisfied constraints
GHC
- [GHC] #13642: GHCi 8.2 simply ignores TH splice using datatype with a forall'd kind signature
GHC
- Re: [GHC] #12102: “Constraints in kinds” illegal family application in instance (+ documentation issues?)
GHC
- [GHC] #13403: Derive instances (Applicative, Monad, ...) for structures lifted over functors
GHC
- [GHC] #13631: In GHCi a result is wrong when -fdefer-typed-holes is used with underscore alone
GHC
- [GHC] #13407: Fix printing of higher-rank kinds
GHC
- [GHC] #13643: Core lint error with TypeInType and TypeFamilyDependencies
GHC
- [GHC] #10600: -fwarn-incomplete-patterns doesn't work with -fno-code
GHC
- [GHC] #13644: overloaded name used in record pattern matching leads to panic! (the 'impossible' happened) in ghc
GHC
- [GHC] #13645: whoCreated produces an uninformative stack trace when an exception is raised in a CAF
GHC
- [GHC] #12962: No automatic SCC annotations for functions marked INLINABLE
GHC
- [GHC] #11272: Overloaded state-monadic function is not specialised
GHC
- [GHC] #12600: Overloaded method causes insufficient specialization
GHC
- [GHC] #13646: strict patterns with no bindings (e.g. `let !() = ...`) trigger -Wunused-pattern-binds
GHC
- [GHC] #11799: Legend for hpc markup colors
GHC
- [GHC] #13647: Tidy up TcTypeable
GHC
- [GHC] #13648: ApplicativeDo selects "GHC.Base.Monad.return" when actions are used without patterns.
GHC
- [GHC] #13649: RebindableSyntax causes type errors when 'fail' is not defined, even if not used.
GHC
- [GHC] #12919: Equality not used for substitution
GHC
- [GHC] #13650: Implement KPush in types
GHC
- [GHC] #10980: Deriving Read instance from datatype with N fields leads to N^2 code size growth
GHC
- [GHC] #13651: Invalid redundant pattern matches with -XTypeFamilyDependencies
GHC
- [GHC] #5546: Documentation errors in Control.Exception.Base
GHC
- [GHC] #13652: Add integer division to GHC.TypeLits
GHC
- [GHC] #13590: Update Cabal submodule to whatever the final Cabal 2.0 release is
GHC
- [GHC] #13653: Re-allocate byteArray lead internal error: evacuate: strange closure type 241
GHC
- [GHC] #13654: Optimize casMutVar# for single-threaded runtime
GHC
- [GHC] #9557: Deriving instances is slow
GHC
- [GHC] #12156: -fdefer-typed-holes causes panic on unbound variable
GHC
- [GHC] #13655: Spurious untouchable type variable in connection with rank-2 type and constraint family
GHC
- [GHC] #13656: Consider implementing atomicModifyMutVar# in Haskell
GHC
- [GHC] #10431: EqualityConstraints extension?
GHC
- [GHC] #13390: Strict literal float-out during desugaring regresses T1969 at -O0
GHC
- [GHC] #13657: Documentation: Functional dependencies by other means
GHC
- [GHC] #13658: Assertion failure on HEAD: "optCoercion changed types!"
GHC
- [GHC] #13659: Bug report: "AThing evaluated unexpectedly tcTyVar a_alF"
GHC
- [GHC] #13016: SPECIALIZE INLINE doesn't necessarily inline specializations of a recursive function
GHC
- [GHC] #13660: Tail after and including `NUL` character in `FilePath`s silently truncated
GHC
- [GHC] #4858: Add Control.Concurrent.forkIOWithUnmask, deprecate forkIOUnmasked
GHC
- [GHC] #8101: No pattern match non-exhaustiveness warnings when compiling with -fno-code
GHC
- [GHC] #13114: UniqSet definition seems shady
GHC
- [GHC] #13661: User manual warnings
GHC
- [GHC] #13662: Type inference fails in connection with TypeFamilies, 'let', type equalities ...
GHC
- [GHC] #13662: Type inference fails in connection with TypeFamilies, 'let', type equalities ...
GHC
- [GHC] #13662: Type inference fails in connection with TypeFamilies, 'let', type equalities ...
GHC
- [GHC] #13662: Type inference fails in connection with TypeFamilies, 'let', type equalities ...
GHC
- [GHC] #13662: Type inference fails in connection with TypeFamilies, 'let', type equalities ...
GHC
- [GHC] #13662: Type inference fails in connection with TypeFamilies, 'let', type equalities ...
GHC
- [GHC] #13662: Type inference fails in connection with TypeFamilies, 'let', type equalities ...
GHC
- [GHC] #13663: Option to disable turning recursive let-bindings to recursive functions
GHC
- [GHC] #13664: Ill formatted warning about tabulators
GHC
- [GHC] #13575: GHC downloads do not work
GHC
- [GHC] #13568: Name is reported as ambiguous and not in scope
GHC
- [GHC] #13665: Broken Link in GHC Docs for Custom compile-time errors
GHC
- [GHC] #2168: ghci should show haddock comments for identifier
GHC
- [GHC] #13667: Error while running stack upgrade
GHC
- [GHC] #12056: Too aggressive `-w` option
GHC
- [GHC] #13211: NegativeLiterals -0.0 :: Double
GHC
- [GHC] #4820: "Invalid object in isRetainer" when doing retainer profiling in GHC 7 branch
GHC
- [GHC] #8332: hp2ps does not escape parentheses
GHC
- [GHC] #13668: Space leak re-introduced
GHC
- [GHC] #13669: Identifier "Otherwise" in guarded equation can crash a program
GHC
- [GHC] #13670: Improving Type Error Messages
GHC
- [GHC] #13671: Core lint error with PatternSynonyms and undefined
GHC
- [GHC] #8809: Prettier error messages?
GHC
- [GHC] #13672: Pattern match on LHS of pattern synonym declaration
GHC
- [GHC] #13673: Core lint error with defer-typed-holes
GHC
- [GHC] #12203: Allow constructors on LHS of (implicit) bidirectional pattern synonym
GHC
- [GHC] #13674: GHC doesn't discharge heterogenous equality constraint when it ought to
GHC
- [GHC] #13675: Binary.get(TyClDecl): ForeignType
GHC
- [GHC] #13676: Command line written to stats file by the rts is not executable
GHC
- [GHC] #13677: Incorrect parenthesization of type in error message
GHC
- [GHC] #314: #line pragmas not respected inside nested comments
GHC
- [GHC] #11819: Full validation issues for 8.0.1
GHC
- [GHC] #13239: Phabricator upgrade broke the ticket custom field
GHC
- [GHC] #13150: unknown warning is not reported by GHC
GHC
- [GHC] #13185: haskell-relational-query: ghc: panic! (the 'impossible' happened)
GHC
- [GHC] #1290: ghc runs preprocessor too much
GHC
- [GHC] #1318: add warning for prefix negate operator and flag to replace it with negative numeric literals
GHC
- [GHC] #1349: Generalise the ! and UNPACK mechanism for data types, to unpack function arguments
GHC
- [GHC] #3024: Rewrite hp2ps in Haskell
GHC
- [GHC] #3021: A way to programmatically insert marks into heap profiling output
GHC
- [GHC] #4102: Bit manipulation built-ins
GHC
- [GHC] #7104: Add tryWriteTBQueue to Control.Concurrent.STM.TBQueue
GHC
- [GHC] #7320: GHC crashes when building on 32-bit Linux in a Linode
GHC
- [GHC] #7337: GHC does not generate great code for bit-level rotation
GHC
- [GHC] #7461: Error messages about "do" statements contain false information
GHC
- [GHC] #8082: Ordering of assembly blocks affects performance
GHC
- [GHC] #8573: "evacuate: strange closure type 0" when creating large array
GHC
- [GHC] #8396: cleanup / refactor native code gens
GHC
- [GHC] #8949: switch -msse2 to be on by default
GHC
- [GHC] #8875: Track Exceptions
GHC
- [GHC] #9120: Cache intermediate powers
GHC
- [GHC] #13678: Overhaul the linker
GHC
- [GHC] #9287: changed dependency generation
GHC
- [GHC] #10323: Add Android and iOS Operating Systems in Trac
GHC
- [GHC] #10584: Installation of SFML failed
GHC
- [GHC] #13375: ghc-pkg "cache is out of date" message breaks testsuite
GHC
- [GHC] #11080: Open data kinds
GHC
- [GHC] #13679: Kill eqIfaceType
GHC
- [GHC] #13680: Can't use TypeApplications with empty list expression
GHC
- [GHC] #13681: Remove deprecated ForceSpecConstr
GHC
- [GHC] #13682: When printf "%g" with trailing 0 number, decial point be printed.
GHC
- [GHC] #13604: ghci no longer loads dynamic .o files by default if they were built with -O
GHC
- [GHC] #13683: Use epoll rather than poll where appropriate
GHC
- [GHC] #13684: Core lint error with defer-typed-holes and coerce
GHC
- [GHC] #13685: ghc: panic
GHC
- [GHC] #13686: Compile a few modules for profiling unconditionally
GHC
- [GHC] #13687: GHC internal error: associated type not in scope during typechecking
GHC
- [GHC] #12850: Panic with unboxed integers and ghci
GHC
- [GHC] #13688: Allow splices in definition of pattern synonym
GHC
- [GHC] #13473: Variables in patterns made with QuasiQuotes sometimes don't get bound
GHC
- [GHC] #13547: Lint error in arrows program
GHC
- [GHC] #5777: core lint error with arrow notation and GADTs
GHC
- [GHC] #9450: GHC instantiates Data instances before checking hs-boot files
GHC
- [GHC] #13591: "*** Exception: expectJust showModule" in ghci with hs-boot
GHC
- [GHC] #11722: No TypeRep for unboxed tuples
GHC
- [GHC] #13417: piResultTys1
GHC
- [GHC] #12083: ghc-8.0.1-rc4: tyConRoles sees a TcTyCon
GHC
- [GHC] #12991: panic when using IrredPreds in a type checker plugin.
GHC
- [GHC] #11964: Without TypeInType, inconsistently accepts Data.Kind.Type but not type synonym
GHC
- [GHC] #13545: Remove duplication between lookupSubBndrOcc and lookupExportChild
GHC
- [GHC] #8281: The impossible happened: primRepToFFIType
GHC
- [GHC] #11966: Surprising behavior with higher-rank quantification of kind variables
GHC
- [GHC] #13271: GHC Panic With Injective Type Families
GHC
- [GHC] #13689: Data.Either doesn't export INLINABLE short functions like "rights"
GHC
- [GHC] #13690: Running profiling tests in the GHCi way is extremely slow
GHC
- [GHC] #13691: Bump time submodule
GHC
- [GHC] #13492: -p option report much less time than actual on high intensity of FFI calls application
GHC
- [GHC] #8118: <stdout>: commitAndReleaseBuffer: invalid argument (invalid character)
GHC
- [GHC] #13607: Panic when shared object file is missing: Dynamic linker not initialised (was: Panic with profiled compiler: Dynamic linker not initialised)
GHC
- [GHC] #13531: GHC fails with "Dynamic linker not initialised" when -j is on and trying to load nonexistent .so file
GHC
- [GHC] #13692: Constructors and such should be able to move around seq# sometimes
GHC
- [GHC] #10346: Cross-module SpecConstr
GHC
- [GHC] #9285: IO manager startup procedure somewhat odd
GHC
- [GHC] #13693: RTS cannot be reinitialized reliably after hs_exit()
GHC
- [GHC] #13346: Run nofib with -fspec-constr-keen
GHC
- [GHC] #13694: CSE runs before SpecConstr
GHC
- [GHC] #13695: Highly nested UNPACKed data causes panic
GHC
- [GHC] #13696: rts/linker/ElfTypes.h does not compile on most of UNREG arches (and some registerised arches)
GHC
- [GHC] #12610: Emit tab warning promptly
GHC
- [GHC] #13697: Teach GHCi to deduplicate history
GHC
- [GHC] #605: Optimisation: strict enumerations
GHC
- [GHC] #13698: Add a more complete example for the special SPEC argument to the user guide
GHC
- [GHC] #13535: vector test suite uses excessive memory on GHC 8.2
GHC
- [GHC] #13699: Pretty printing: Strict record fields are not parenthesized properly
GHC
- [GHC] #7897: MakeTypeRep fingerprints be proper, robust fingerprints
GHC
- [GHC] #1600: Optimisation: CPR the results of IO
GHC
- [GHC] #13700: GHCi command listing possible type class instances
GHC
- [GHC] #13701: GHCi 2x slower without -keep-tmp-files
GHC
- [GHC] #13702: GHC can't produce position independent executables
GHC
- [GHC] #10892: ApplicativeDo should use *> and <*
GHC
- [GHC] #13703: Internal libraries regression in GHC 8.2 (ghc-pkg handling)
GHC
- [GHC] #13704: -main-is flag should change exports in default module header
GHC
- [GHC] #13309: Use liftA2 in ApplicativeDo
GHC
- [GHC] #8657: -fregs-graph still has a limit on spill slots
GHC
- [GHC] #13705: Failure of improvement for type-family dependencies
GHC
- [GHC] #13706: ghci messages like "Ok, modules loaded: ..." are impractical for large sets of modules
GHC
- [GHC] #13707: xmobar crashes with segmentation faults?
GHC
- [GHC] #13708: Panic! (the "impossible" happened) bug in GHC 8.2.1 rc2
GHC
- [GHC] #13709: Drop GCC Driver
GHC
- [GHC] #13710: panic with boot and -jX
GHC
- [GHC] #13711: uname: illegal option -- o when running make clean in nofib
GHC
- [GHC] #7395: DefaultSignatures conflict with default implementations
GHC
- [GHC] #11439: Request for comments: Allow duplicate type signatures
GHC
- [GHC] #13712: Attach size to ForeignPtr
GHC
- [GHC] #13713: fdefer-type-errors makes missing import errors disappear
GHC
- [GHC] #12001: RFC: Add pattern synonyms to base
GHC
- [GHC] #13714: Guard pages instead of Heap/Stack limit checks in Cmm
GHC
- [GHC] #13715: test dynamic-paper for way profasm fails with Simplifier ticks exhausted
GHC
- [GHC] #13716: Move CI to Jenkins
GHC
- [GHC] #13390: String literal float-out during desugaring regresses T1969 at -O0 (was: Strict literal float-out during desugaring regresses T1969 at -O0)
GHC
- [GHC] #13717: Pattern synonym exhaustiveness checks don't play well with EmptyCase
GHC
- [GHC] #13718: diagnostic colors: differentiate between message head and message body
GHC
- [GHC] #13719: checkFamInstConsistency dominates compile time
GHC
- [GHC] #13720: INLINE pragma semantics changed since 8.0.2
GHC
- [GHC] #8721: Testsuite not reporting errors for DYN way on OS X
GHC
- [GHC] #12468: GADTs don't refine hole types
GHC
- [GHC] #11325: Type of hole does not get refined after pattern matching on [GADT] constructors
GHC
- [GHC] #8703: Use guard pages rather than heap checks
GHC
- [GHC] #13721: posix004 test succeeds but then I get an Apple problem report window that says: "posix004 quit unexpectedly"
GHC
- [GHC] #13722: intermittent abort crash from make TEST=hs_try_putmvar003 WAY=threaded2
GHC
- [GHC] #13723: Recover gracefully from simplifier tick exhaustion
GHC
- [GHC] #13724: Clamping of llvm llc to -O1 and -O2
GHC
- [GHC] #13725: Remove false dependency on the destination of the popcnt instruction
GHC
- [GHC] #8581: Pattern synonym used in an expression context could have different constraints to pattern used in a pattern context
GHC
- [GHC] #13726: Declaring GADT constructor and associated data family with the same name gives weird error
GHC
- [GHC] #13727: `-Wmissing-home-modules` doesn't properly recognize filepath-qualified modules
GHC
- [GHC] #13728: Clarify the difference between NameL and NameU in Template Haskell
GHC
- Re: [GHC] #13625: GHC internal error: ‘Y’ is not in scope during type checking, but it passed the renamer
GHC
- [GHC] #13729: ghc does not pick up TH changes across package boundaries
GHC
- [GHC] #13226: Compiler allocation regressions from top-level string literal patch
GHC
- [GHC] #13730: Running GLUT code in GHCi yields NSInternalInconsistencyException
GHC
- [GHC] #13119: yesod-auth-1.4.15: ghc: panic! (the 'impossible' happened) Linker error
GHC
- [GHC] #12897: yesod-auth-1.4.13.2 failed during the building phase.
GHC
- [GHC] #13731: DeriveFunctor and friends don't understand type families
GHC
- [GHC] #12136: SIGABRT on right-shift operation against long negative integer
GHC
- [GHC] #12390: List rules for `Coercible` instances
GHC
- [GHC] #13732: Incorrectly suggests ‘TypeOperators’
GHC
- [GHC] #9936: Data.Fixed truncates 5.17 to 5.16
GHC
- [GHC] #13306: Problems with type inference for static expressions
GHC
- [GHC] #13733: Simplify constraints on RULES LHS
GHC
- [GHC] #13734: Code requires ScopedTypeVariables, possibly erroneously
GHC
- [GHC] #8025: -fno-code and Template Haskell are incompatible
GHC
- [GHC] #13735: RankNTypes don't work with PatternSynonyms
GHC
- [GHC] #9700: Support C structures in Haskell FFI
GHC
- [GHC] #8048: Register spilling produces ineffecient/highly contending code
GHC
- [GHC] #10012: Cheap-to-compute values aren't pushed into case branches inducing unnecessary register pressure
GHC
- [GHC] #8272: testing if SpLim=$rbp and Sp=$rsp changed performance at all
GHC
- [GHC] #13736: GHC panic with DataKinds and TypeOperators
GHC
- [GHC] #11593: Template Haskell: Add a way to get names that are neither capturable nor capturing.
GHC
- [GHC] #13737: Have typechecking produce HsType Typechecked instead of Type
GHC
- [GHC] #9445: GHC Panic: Tick Exhausted with high factor
GHC
- [GHC] #13738: TypeApplications-related GHC internal error
GHC
- [GHC] #13740: GHC panic with operator constructor of newtype
GHC
- [GHC] #13741: Newtype unwrapping causes GHC panic
GHC
- [GHC] #13742: Code using ConstraintKinds needs explicit kind signature with GHC 8.2.1
GHC
- [GHC] #1: Implicit parameters cause strange behavi
GHC
- [GHC] #2: rewrite rules, forall, no -fglasgow-exts
GHC
- [GHC] #3: DiffArray should be instance of Show
GHC
- [GHC] #4: -fext-core -fno-core behaves funny
GHC
- [GHC] #13570: CoreFVs patch makes n-body slower
GHC
- [GHC] #13629: sqrt should use machine instruction on x86_64
GHC
- [GHC] #13743: Colourise command output
GHC
- [GHC] #10832: Generalize injective type families
GHC
- [GHC] #13744: Compile-time regression in 8.2 when compiling bloodhound's test suite
GHC
- [GHC] #13092: family instance consistency checks are too pessimistic
GHC
- [GHC] #13745: Investigate compile-time regressions in regex-tdfa-1.2.2
GHC
- [GHC] #13746: Typeable changes in base-4.10 break ChasingBottoms's test suite
GHC
- [GHC] #10397: Compiler performance regression 7.6 -> 7.8 in elimCommonBlocks
GHC
- [GHC] #13747: Can't use 'instance' keyword in associated type family instance
GHC
- [GHC] #13748: Variables pretty-printed from -ddump-deriv are not scoped properly
GHC
- [GHC] #10735: Smooth out the differences between `compiler/utils/Pretty.hs` and `libraries/pretty`
GHC
- [GHC] #13749: Panic (initTc: unresolved constraints) on some bad code
GHC
- [GHC] #13750: GHC produces incorrect coercions in hairy code
GHC
- [GHC] #10421: exponential blowup in inlining (without INLINE pragmas)
GHC
- [GHC] #13751: Runtime crash with <<loop>> after concurrent stressing of STM computatinos.
GHC
- [GHC] #9438: panic: loading archives not supported
GHC
- [GHC] #13752: Odd pattern synonym type errors
GHC
- [GHC] #13753: Improve GHC's ghc package environment lookup logic
GHC
- [GHC] #13754: ghc-8.0.2+ rejects more instance declarations
GHC
- [GHC] #13755: GHC-8.0.2+ spits out $dm names in error messages
GHC
- [GHC] #13756: Typo in user guide suggests that there's an -O* option
GHC
- [GHC] #10087: DefaultSignatures: error message mentions internal name
GHC
- [GHC] #13757: Are you for or against writing "otherwise" as a keyword?
GHC
- [GHC] #13253: Exponential compilation time with RWST & ReaderT stack with `-02`
GHC
- [GHC] #8905: Function arguments are always spilled/reloaded if scrutinee is already in WHNF
GHC
- [GHC] #13758: Deriving can't find an instance that holds, standalone deriving works
GHC
- [GHC] #12648: Stack overflow when using monad-unlift
GHC
- [GHC] #12175: Instance resolution regression
GHC
- [GHC] #13759: Strange error message for deriving Data
GHC
- [GHC] #13760: Review: Fix test output after 'Some tidying up of type pretty-printing'
GHC
- [GHC] #13761: Can't create poly-kinded GADT with TypeInType enabled, but can without
GHC
- [GHC] #13762: TypeInType is not documented in the users' guide flag reference
GHC
- [GHC] #8440: Get rid of the remaining static flags
GHC
- [GHC] #13763: Performance regression (~34%) in 8.2.1, poor register allocation(?) in an inner loop over an array
GHC
- [GHC] #13238: Harmonise pretty printing of parens in hsSyn
GHC
- [GHC] #13764: Creating a ticket named "New proposal" in GHC Trac.
GHC
- [GHC] #13765: GHC cannot parse valid Haskell98 whose first identifier is named signature
GHC
- [GHC] #13766: Confusing "reudundant pattern match" in 8.0, no warning at all in 8.2
GHC
- [GHC] #12759: Latest Debian GCC breaks GHC
GHC
- [GHC] #11834: GHC master, not compiling on Archlinux
GHC
- [GHC] #13767: GHCi trips -DS checks at rts/sm/Sanity.c, line 210
GHC
- [GHC] #11621: GHC doesn't see () as a Constraint in type family
GHC
- [GHC] #13768: Incorrect warnings generated by exhaustiveness checker with pattern synonyms / GADT combination
GHC
- [GHC] #13769: T9405 sporadic failure
GHC
- [GHC] #13770: HEAD: Type mentioned in error won't show up in pattern signature
GHC
- [GHC] #12908: Tuple constraints refactoring seems to regress performance considerably
GHC
- [GHC] #11774: Regression on GHC 8 branch (vs 7.10.3) when using the GHC API to parse code that uses TH
GHC
- [GHC] #13385: ghci fails to start when -XRebindableSyntax is passed
GHC
- [GHC] #13771: ghc fails to build on openSUSE
GHC
- [GHC] #12820: Regression around pattern synonyms and higher-rank types
GHC
- [GHC] #12545: Compilation time/space regression in GHC 8.0/8.1 (search in type-level lists and -O)
GHC
- [GHC] #13772: Cannot put HasCallStack on instances
GHC
- [GHC] #13773: Types are not normalized in instance declarations
GHC
Last message date:
Wed May 31 19:43:12 UTC 2017
Archived on: Wed May 31 19:19:59 UTC 2017
This archive was generated by
Pipermail 0.09 (Mailman edition).