Skip to content

GitLab

  • Projects
  • Groups
  • Snippets
  • Help
    • Loading...
  • Help
    • Help
    • Support
    • Community forum
    • Submit feedback
  • Sign in / Register
GHC
GHC
  • Project overview
    • Project overview
    • Details
    • Activity
    • Releases
  • Repository
    • Repository
    • Files
    • Commits
    • Branches
    • Tags
    • Contributors
    • Graph
    • Compare
    • Locked Files
  • Issues 4,310
    • Issues 4,310
    • List
    • Boards
    • Labels
    • Service Desk
    • Milestones
    • Iterations
  • Merge Requests 382
    • Merge Requests 382
  • Requirements
    • Requirements
    • List
  • CI / CD
    • CI / CD
    • Pipelines
    • Jobs
    • Schedules
  • Security & Compliance
    • Security & Compliance
    • Dependency List
    • License Compliance
  • Operations
    • Operations
    • Incidents
    • Environments
  • Analytics
    • Analytics
    • CI / CD
    • Code Review
    • Insights
    • Issue
    • Repository
    • Value Stream
  • Wiki
    • Wiki
  • Snippets
    • Snippets
  • Members
    • Members
  • Collapse sidebar
  • Activity
  • Graph
  • Create a new issue
  • Jobs
  • Commits
  • Issue Boards
  • Glasgow Haskell Compiler
  • GHCGHC
  • Issues

  • Open 2,771
  • Closed 12,275
  • All 15,046
New issue
  • Priority Created date Last updated Milestone due date Due date Popularity Label priority Manual Weight
  • Existentials in newtypes
    #15590 · opened Aug 31, 2018 by NioBium   8.6.1   5   Pnormal Trac import feature request
    • CLOSED
    • 1
    updated Jul 07, 2019
  • Inconsistent kind variable binder visibility between associated and non-associated type families
    #15591 · opened Sep 01, 2018 by Ryan Scott   8.8.1   5   Pnormal Trac import TypeApplications TypeFamilies bug
    • CLOSED
    • 12
    updated Jul 07, 2019
  • Type families without CUSKs cannot be given visible kind variable binders
    #15592 · opened Sep 01, 2018 by Ryan Scott   8.8.1   5   CUSKs Pnormal Trac import TypeApplications TypeFamilies bug
    • CLOSED
    • 21
    updated Jul 07, 2019
  • QuantifiedConstraints: trouble with type family
    #15593 · opened Sep 02, 2018 by Icelandjack   8.6.1   5   ConstraintKinds Pnormal QuantifiedConstraints Trac import bug
    • CLOSED
    • 4
    updated Jul 07, 2019
  • --abi-hash with Backpack incorrectly loads modules from dependent packages
    #15594 · opened Sep 02, 2018 by Edward Z. Yang   8.6.1   5   Pnormal Trac import backpack bug
    • CLOSED
    • 1
    • 4
    updated Sep 28, 2020
  • GHC shouting: panic!
    #15597 · opened Sep 03, 2018 by tstr   5   Pnormal Trac import TypeInType bug compiler crash
    • CLOSED
    • 1
    updated Jul 07, 2019
  • Bug while writing a simple parser with Parsec
    #15600 · opened Sep 03, 2018 by roehst   8.6.1   5   Pnormal Trac import bug
    • CLOSED
    • 1
    updated Jul 07, 2019
  • Unexpected compile error on type level lists with a single element
    #15601 · opened Sep 03, 2018 by erikd   8.6.1   5   Pnormal Trac import bug error messages
    • CLOSED
    • 2
    updated Jul 07, 2019
  • Profiling RTS flag `-po` does not work
    #15604 · opened Sep 05, 2018 by Ömer Sinan Ağacan   8.6.1   5   Pnormal Trac import bug profiling
    • CLOSED
    • 3
    updated Jul 07, 2019
  • RebindableSyntax warns `return` is not in scope when trying to call `pure`, but does not desugar between the two
    #15607 · opened Sep 05, 2018 by isovector   8.6.1   5   Pnormal RebindableSyntax Trac import bug
    • CLOSED
    • 2
    updated Jul 07, 2019
  • Segfault in retainer profiling
    #15608 · opened Sep 06, 2018 by Ömer Sinan Ağacan   8.6.3   5   Pnormal Trac import bug profiling
    • CLOSED
    • 9
    updated Jul 07, 2019
  • No skolem info panic: Static pointers and holes
    #15609 · opened Sep 06, 2018 by Matthew Pickering   8.6.1   5   Pnormal Trac import bug
    • CLOSED
    • 2
    updated Jul 07, 2019
  • GHCi command to list instances a (possibly compound) type belongs to
    #15610 · opened Sep 06, 2018 by Icelandjack   8.10.1   0   Plow Trac import feature request ghc proposal
    • CLOSED
    • 7
    updated Jul 07, 2019
  • scope errors lie about what modules are imported
    #15611 · opened Sep 06, 2018 by dmwit   8.8.1   5   Pnormal Trac import bug
    • CLOSED
    • 7
    updated Feb 09, 2021
  • Got Unable to commit 16777216 bytes of memory error on Ubuntu
    #15612 · opened Sep 06, 2018 by figelwump   8.6.1   5   Pnormal Trac import bug
    • CLOSED
    • 1
    updated Aug 08, 2019
  • Rename some mutable closure types for consistency
    #15615 · opened Sep 07, 2018 by Andreas Klebinger   8.6.1   5   Pnormal RTS Trac import task
    • CLOSED
    • 1
    updated Jul 07, 2019
  • Bug when using TimerManager/GHC.Event ?
    #15616 · opened Sep 07, 2018 by ddellacosta   8.6.1   5   Pnormal Trac import bug
    • CLOSED
    • 2
    • 4
    updated Sep 01, 2020
  • Unboxed tuples/sum error message on `a = show 5` in expression evaluation and interactive modes
    #15617 · opened Sep 08, 2018 by ChaiTRex   8.6.1   5   Pnormal Trac import bug error messages
    • CLOSED
    • 20
    updated Sep 01, 2020
  • Unused binding warning should not apply to newtype constructors
    #15618 · opened Sep 08, 2018 by David Feuer   8.6.1   5   Pnormal Trac import bug error messages
    • CLOSED
    • 1
    updated Jul 07, 2019
  • Generalize `E{0,1,2,3,6,9,12}` from `Data.Fixed`
    #15622 · opened Sep 09, 2018 by Alexandre R. Baldé   8.6.1   5   Pnormal Trac import core libraries feature request
    • CLOSED
    • 45
    updated Jul 13, 2019
  • Wrong Endian, ghc-pwd and ghc-cabal on ghc 8.0.1 for powerpc64le (IBM Power)
    #15623 · opened Sep 10, 2018 by francescantoncastro   8.6.1   10   Phighest Trac import bug ghc build failure
    • CLOSED
    • 3
    updated Jul 07, 2019
  • defer-type-errors and equality constraints
    #15624 · opened Sep 10, 2018 by Krzysztof Gogolewski   8.8.1   3   Plow Trac import bug typechecker
    • CLOSED
    • 1
    updated Jul 07, 2019
  • GHC panic, with QuantifiedConstraints
    #15625 · opened Sep 10, 2018 by Icelandjack   5   Pnormal QuantifiedConstraints Trac import bug
    • CLOSED
    • 6
    updated Jul 07, 2019
  • Absent unlifted bindings
    #15627 · opened Sep 11, 2018 by Sebastian Graf   ⊥   5   Pnormal Trac import task
    • CLOSED
    • 13
    updated Nov 30, 2020
  • Higher-rank kinds
    #15628 · opened Sep 11, 2018 by Icelandjack   8.6.1   5   ImpredicativeTypes Pnormal Trac import bug
    • CLOSED
    • 4
    updated Jul 07, 2019
  • "No skolem info" panic (GHC 8.6 only)
    #15629 · opened Sep 11, 2018 by Ryan Scott   8.8.1   5   Pnormal Trac import TypeInType bug compiler crash typechecker
    • CLOSED
    • 9
    updated Jul 07, 2019
  • panic! Simplifier ticks exhausted
    #15630 · opened Sep 11, 2018 by micahshahn   8.6.1   5   Pnormal Trac import bug
    • CLOSED
    • 6
    updated Jul 12, 2020
  • Lost opportunity to eliminate seq
    #15631 · opened Sep 12, 2018 by Simon Peyton Jones   8.6.1   5   Pnormal Trac import bug
    • CLOSED
    • 2
    updated Jul 07, 2019
  • Type-checker plugins aren't loaded in GHCi 8.6.1
    #15633 · opened Sep 12, 2018 by Oleg Grenrus   8.6.3   5   Pnormal Trac import bug plugins typechecker plugins
    • CLOSED
    • 6
    updated Jul 07, 2019
  • Implication introduction for quantified constraints
    #15635 · opened Sep 12, 2018 by David Feuer   8.6.1   5   Pnormal QuantifiedConstraints Trac import feature request
    • CLOSED
    • 3
    updated Jul 07, 2019
  • Implication constraint priority breaks default class implementations
    #15636 · opened Sep 13, 2018 by i-am-tom   8.6.1   5   Pnormal QuantifiedConstraints Trac import bug
    • CLOSED
    • 3
    updated Jul 07, 2019
  • Ambiguous type variables in GeneralisedNewtypeDeriving
    #15637 · opened Sep 13, 2018 by i-am-tom   8.8.1   5   Pnormal Trac import bug deriving
    • CLOSED
    • 4
    updated Jul 07, 2019
  • Make Ptr argument to hGetBuf and hGetBufSome strict
    #15638 · opened Sep 13, 2018 by Andrew Martin   8.8.1   5   Pnormal Trac import task
    • CLOSED
    • 2
    updated Jul 07, 2019
  • Git repositories have several problems
    #15641 · opened Sep 14, 2018 by Philippe   7   Phigh Trac import bug infrastructure
    • CLOSED
    • 4
    updated Jul 07, 2019
  • Test Suite Unexpected failure for ghci063(ghci)
    #15643 · opened Sep 14, 2018 by Julian Leviston   5   Pnormal Trac import bug testsuite
    • CLOSED
    • 3
    updated Jan 23, 2021
  • TypeChecking of Monad patterns incorrect with RebindableSyntax and OverloadedStrings
    #15645 · opened Sep 14, 2018 by Neil Mitchell   8.8.1   5   Pnormal Trac import bug ghc proposal
    • CLOSED
    • 11
    updated Jul 07, 2019
  • ghc: panic! (the 'impossible' happened)
    #15647 · opened Sep 14, 2018 by monomon   8.6.1   5   Pnormal Trac import bug compiler crash
    • CLOSED
    • 2
    updated Jul 07, 2019
  • Core Lint error with source-level unboxed equality
    #15648 · opened Sep 15, 2018 by Ryan Scott   8.8.1   5   Pnormal Trac import bug compiler crash
    • CLOSED
    • 14
    updated Jul 07, 2019
  • Errors about ambiguous untouchable variable when using constraint variable in RankN type
    #15649 · opened Sep 16, 2018 by infinity0   8.6.1   5   Pnormal Trac import bug
    • CLOSED
    • 3
    updated Jul 07, 2019
  • Both `Ptr a` in SerializedCompact are inaccurate because of the `a`
    #15653 · opened Sep 18, 2018 by chessai   9.0.1   5   API annotations Pnormal Trac import bug compact normal forms
    • CLOSED
    • 3
    updated Jul 23, 2020
  • Use deriving Functor in the codebase
    #15654 · opened Sep 18, 2018 by Krzysztof Gogolewski   8.10.1   5   Pnormal Trac import task
    • CLOSED
    • 2
    updated Jul 07, 2019
  • Extend -Wall with incomplete-uni-patterns and incomplete-record-updates
    #15656 · opened Sep 18, 2018 by Chaitanya Koparkar   9.2.1   5   Pnormal Trac import feature request ghc proposal
    • CLOSED
    • 1
    • 2
    • 38
    updated Feb 10, 2021
  • strange inferred kind with TypeInType
    #15658 · opened Sep 19, 2018 by dmwit   8.10.1   5   Pnormal Trac import bug ghc proposal visible dependent quantification
    • CLOSED
    • 7
    updated Jul 07, 2019
  • Wacky error message when RULE mentions out-of-scope variable
    #15659 · opened Sep 19, 2018 by Ryan Scott   8.8.1   5   Pnormal Trac import bug error messages newcomer
    • CLOSED
    • 1
    updated Jul 07, 2019
  • Line pragmas appear to be slightly broken with Clang's CPP
    #15662 · opened Sep 21, 2018 by Ben Gamari   8.10.1   5   Pnormal Trac import bug
    • CLOSED
    • 3
    updated May 06, 2020
  • Core Lint error
    #15664 · opened Sep 21, 2018 by Icelandjack   8.6.1   5   Pnormal Trac import TypeInType bug
    • CLOSED
    • 6
    updated Jul 07, 2019
  • Dependent type synonym in recursive type family causes GHC to panic
    #15666 · opened Sep 22, 2018 by tydeu   8.6.1   5   Pnormal Trac import bug compiler crash newcomer
    • CLOSED
    • 8
    updated Jul 07, 2019
  • Readonly permissions bits are wrong
    #15667 · opened Sep 23, 2018 by Tamar Christina   8.6.2   7   Phigh Trac import bug
    • CLOSED
    • 2
    updated Jul 07, 2019
  • T7040_ghci has a suspicious testcase failure
    #15669 · opened Sep 23, 2018 by Tamar Christina   8.8.1   7   Phigh Trac import bug
    • CLOSED
    • 3
    updated Jul 07, 2019
  • Link errors due to forcibly exporting findPtr
    #15671 · opened Sep 23, 2018 by Tamar Christina   8.8.1   5   Pnormal Trac import bug
    • CLOSED
    • 7
    updated Jul 07, 2019
  • heap overflow with Bits.shift and Integer
    #15673 · opened Sep 24, 2018 by mcmayer   8.8.1   5   Pnormal Trac import bug
    • CLOSED
    • 8
    updated Jul 07, 2019
  • Type operators in existential context cannot be parsed
    #15675 · opened Sep 25, 2018 by Vladislav Zavialov   8.8.1   5   Pnormal Trac import bug parser
    • CLOSED
    • 3
    updated Jul 07, 2019
  • Use String rather than [Char] where possible
    #15679 · opened Sep 26, 2018 by Simon Peyton Jones   8.6.1   5   Pnormal Trac import bug
    • CLOSED
    • 3
    • 0
    updated Jun 05, 2020
  • Pattern signature not inferred
    #15685 · opened Sep 28, 2018 by Icelandjack   8.6.2   5   Pnormal PatternSynonyms Trac import bug
    • CLOSED
    • 5
    updated Jul 07, 2019
  • Different results depending on if the code was compiled with or without optimizations
    #15686 · opened Sep 28, 2018 by Darwin226   8.4.1   5   Pnormal Trac import bug incorrect runtime result
    • CLOSED
    • 1
    updated Jul 07, 2019
  • Marking Pred(S n) = n as injective
    #15691 · opened Sep 30, 2018 by Icelandjack   8.6.1   5   Pnormal Trac import TypeFamilies bug injective type families typechecker
    • CLOSED
    • 2
    updated Jul 07, 2019
  • GHC panic from pattern synonyms + deferred type errors
    #15692 · opened Sep 30, 2018 by Icelandjack   8.6.2   5   Pnormal PatternSynonyms Trac import TypeInType bug compiler crash
    • CLOSED
    • 6
    updated Jul 07, 2019
  • GHC panic from pattern synonym, "Type-correct unfilled coercion hole"
    #15694 · opened Sep 30, 2018 by Icelandjack   8.6.1   5   Pnormal PatternSynonyms Trac import bug
    • CLOSED
    • 3
    updated Jul 07, 2019
  • Core Lint error, from -fobject-code + defer type errors + pattern synonyms + other stuff
    #15695 · opened Sep 30, 2018 by Icelandjack   8.6.2   5   Pnormal Trac import bug compiler crash
    • CLOSED
    • 4
    updated Jul 07, 2019
  • Derived Ord instance for enumerations with more than 8 elements seems to be incorrect
    #15696 · opened Oct 02, 2018 by mrkkrp   8.6.2   10   Phighest Trac import bug incorrect runtime result
    • CLOSED
    • 88
    updated Jul 18, 2019
  • Plugins cause GHC to panic: cannot find dynamic libraries
    #15700 · opened Oct 02, 2018 by sheaf   8.6.2   5   Pnormal Trac import bug compiler crash
    • CLOSED
    • 14
    updated Jul 07, 2019
  • HEAD: Build failure in ghc-prim
    #15701 · opened Oct 03, 2018 by Peter Trommler   8.8.1   5   Pnormal Trac import bug ghc build failure
    • CLOSED
    • 2
    updated Jul 07, 2019
  • "-main-is" flag is broken for recent ghc-head
    #15702 · opened Oct 03, 2018 by Cheng Shao   8.8.1   5   Pnormal Trac import bug error messages
    • CLOSED
    • 6
    updated Jul 07, 2019
  • Different saturations of the same polymorphic-kinded type constructor aren't seen as apart types
    #15704 · opened Oct 04, 2018 by mniip   8.6.1   5   Pnormal Trac import TypeFamilies bug typechecker
    • CLOSED
    • 8
    updated Jul 07, 2019
  • Refactor NewHsTypeX to DerivedCoreTy
    #15706 · opened Oct 05, 2018 by Vladislav Zavialov   9.0.1   3   Plow Trac import task
    • CLOSED
    • 2
    • 5
    updated Dec 19, 2020
  • GHC panic using TypeInType with minimal source code
    #15709 · opened Oct 05, 2018 by jnape   5   Pnormal Trac import TypeInType bug compiler crash
    • CLOSED
    • 2
    updated Jul 07, 2019
  • Kind inference of class variables does not examine associated types
    #15711 · opened Oct 05, 2018 by Richard Eisenberg   5   Pnormal Trac import TypeInType bug
    • CLOSED
    • 2
    updated Jul 07, 2019
  • GHC panic with -XDerivingVia
    #15712 · opened Oct 05, 2018 by Icelandjack   5   DerivingVia Pnormal Trac import bug
    • CLOSED
    • 4
    updated Feb 09, 2020
  • Bogus -Woverlapping-patterns warning with OverloadedStrings
    #15713 · opened Oct 06, 2018 by quasicomputational   5   Pnormal Trac import bug pattern match warnings
    • CLOSED
    • 2
    • 0
    updated Jul 07, 2019
  • Compacting StaticPtr of a function doesn't work
    #15714 · opened Oct 06, 2018 by Ömer Sinan Ağacan   5   Pnormal Trac import bug
    • CLOSED
    • 4
    updated Jul 07, 2019
  • problematic openFile with named pipes
    #15715 · opened Oct 07, 2018 by adp   8.6.3   5   API annotations Pnormal Trac import bug core libraries incorrect runtime result
    • CLOSED
    • 5
    updated Jul 07, 2019
  • GHC hangs on default implementation of type family
    #15716 · opened Oct 07, 2018 by Heimdell   8.4.1   7   Phigh Trac import bug compiler crash
    • CLOSED
    • 3
    updated Jul 07, 2019
  • Build panic on ghc-8.6.1 under FreeBSD when using -fllvm
    #15718 · opened Oct 08, 2018 by gwright@antiope.com   8.8.1   7   Phigh Trac import bug compiler crash
    • CLOSED
    • 8
    updated Jul 07, 2019
  • Command `:show bindings` throws exception for bindings without `let`
    #15721 · opened Oct 08, 2018 by Tao He   8.8.1   7   GHCi Phigh Trac import bug newcomer
    • CLOSED
    • 5
    updated Jul 07, 2019
  • Add -Wstar-is-type to the User's Guide
    #15722 · opened Oct 08, 2018 by Vladislav Zavialov   8.6.2   5   Pnormal Trac import documentation task
    • CLOSED
    • 1
    updated Jul 07, 2019
  • -prof -fPIC -fexternal-dynamic-refs generates non-PIC relocations for external symbol
    #15723 · opened Oct 08, 2018 by Zejun Wu   8.10.1   5   Pnormal Trac import bug code generation
    • CLOSED
    • 5
    updated Jul 07, 2019
  • GHC panic with malformed pragma
    #15724 · opened Oct 08, 2018 by etorreborre   5   Pnormal Trac import bug
    • CLOSED
    • 2
    updated Jul 07, 2019
  • Core Lint error: Trans coercion mis-match
    #15725 · opened Oct 09, 2018 by Ryan Scott   8.8.1   5   Pnormal Trac import bug compiler crash
    • CLOSED
    • 9
    updated Jul 07, 2019
  • Program with safe array operations triggers debug runtime assertion
    #15728 · opened Oct 09, 2018 by Ömer Sinan Ağacan   10   Phighest RTS Trac import bug
    • CLOSED
    • 7
    updated Jul 07, 2019
  • Static GHCi can segfault when accessing .bss section in C
    #15729 · opened Oct 09, 2018 by Zejun Wu   8.10.1   5   GHCi Pnormal Trac import bug
    • CLOSED
    • 6
    updated Jul 07, 2019
  • SCC/HPC/CORE annotation can change the meaning of an expression
    #15730 · opened Oct 09, 2018 by Vladislav Zavialov   7   Phigh Trac import bug incorrect runtime result parser
    • CLOSED
    • 1
    • 7
    updated Jan 02, 2020
  • Several links in GHC.Exts.Heap documentation are broken
    #15733 · opened Oct 10, 2018 by Matthew Pickering   8.8.1   5   Pnormal Trac import newcomer task
    • CLOSED
    • 4
    updated Jul 07, 2019
  • Testsuite failures from validate --slow
    #15736 · opened Oct 10, 2018 by jrp2014   10   Phighest Trac import bug incorrect runtime result testsuite
    • CLOSED
    • 26
    updated May 31, 2020
  • -ddump-splices omits required parentheses around quantified constraints
    #15738 · opened Oct 11, 2018 by Ryan Scott   8.8.1   5   Pnormal TemplateHaskell Trac import bug
    • CLOSED
    • 2
    updated Jul 07, 2019
  • Type family with higher-rank result is too accepting
    #15740 · opened Oct 11, 2018 by Richard Eisenberg   8.8.1   10   Phighest Trac import TypeFamilies TypeInType bug
    • CLOSED
    • 7
    updated Jul 07, 2019
  • GHC configure step can fail when CC=clang
    #15742 · opened Oct 12, 2018 by judah   8.8.2   5   Phighest Trac import bug
    • CLOSED
    • 5
    • 1
    • 3
    updated Jan 07, 2020
  • Nail down the Required/Inferred/Specified story
    #15743 · opened Oct 12, 2018 by Simon Peyton Jones   5   Pnormal Trac import bug
    • CLOSED
    • 14
    updated Jul 07, 2019
  • GHC panics when builds for arm as: ghc-stage1: panic! (the 'impossible' happened): padLiveArgs -- i > regNum ??
    #15747 · opened Oct 14, 2018 by Sergei Trofimovich   5   LLVM backend Pnormal Trac import bug
    • CLOSED
    • 1
    updated Jul 07, 2019
  • panic
    #15748 · opened Oct 14, 2018 by awf   5   Pnormal Trac import bug
    • CLOSED
    • 6
    updated Jul 07, 2019
  • Long Harbormaster builds
    #15749 · opened Oct 14, 2018 by Krzysztof Gogolewski   5   Pnormal Trac import bug infrastructure
    • CLOSED
    • 2
    updated Jul 07, 2019
  • Investigate haddock.base perf test
    #15750 · opened Oct 14, 2018 by Richard Eisenberg   5   Pnormal Trac import task testsuite
    • CLOSED
    • 1
    updated Jul 07, 2019
  • Inconsistent pattern-match warnings when using guards versus case expressions
    #15753 · opened Oct 16, 2018 by Ryan Scott   8.10.1   5   Pnormal Trac import bug error messages pattern match warnings
    • CLOSED
    • 3
    • 19
    updated Sep 18, 2019
  • Move free variable computation to after STG passes
    #15754 · opened Oct 16, 2018 by Ben Gamari   8.8.1   5   Pnormal Trac import bug
    • CLOSED
    • 14
    updated Jul 07, 2019
  • randomRIO panic on (GHC version 8.4.3 for x86_64-apple-darwin)
    #15755 · opened Oct 17, 2018 by cmal   5   Pnormal Trac import bug
    • CLOSED
    • 3
    updated Jul 07, 2019
  • Coercion Variable Almost Devoid Checking in ForAllCo
    #15757 · opened Oct 17, 2018 by Ningning Xie   5   Pnormal Trac import task
    • CLOSED
    • 3
    updated Jul 07, 2019
  • hsc2hs broken due to incorrect argument passing to the hsc2hs executable
    #15758 · opened Oct 17, 2018 by Ömer Sinan Ağacan   5   Pnormal Trac import bug
    • CLOSED
    • 8
    updated Jul 07, 2019
  • pprFamInstLHS drops parentheses
    #15761 · opened Oct 17, 2018 by Richard Eisenberg   8.6.2   5   Pnormal Trac import bug
    • CLOSED
    • 1
    • 3
    updated Jul 07, 2019
  • GHC panic from PolyKinds + DataKinds
    #15764 · opened Oct 17, 2018 by Icelandjack   5   Pnormal Trac import bug
    • CLOSED
    • 1
    updated Jul 07, 2019
  • Make the "extract" functions in RnTypes pure
    #15765 · opened Oct 17, 2018 by Richard Eisenberg   5   Pnormal Trac import task
    • CLOSED
    • 2
    updated Jul 07, 2019
  • GeneralizedNewtypeDeriving should support classes with ambiguous types
    #15766 · opened Oct 17, 2018 by reinerp   5   Pnormal Trac import bug
    • CLOSED
    • 1
    updated Jul 07, 2019
  • Prev
  • 1
  • …
  • 115
  • 116
  • 117
  • 118
  • 119
  • 120
  • 121
  • 122
  • 123
  • Next