Skip to content
Snippets Groups Projects
  1. Sep 19, 2023
    • John Ericson's avatar
      Remove `ghc-cabal` · 35bc506b
      John Ericson authored and Marge Bot's avatar Marge Bot committed
      It is dead code since the Make build system was removed.
      
      I tried to go over every match of `git grep -i ghc-cabal` to find other
      stray bits. Some of those might be workarounds that can be further
      removed.
      35bc506b
    • sheaf's avatar
      Validity: refactor treatment of data families · 1eed645c
      sheaf authored and Marge Bot's avatar Marge Bot committed
      This commit refactors the reporting of unused type variables in type
      and data family instances to be more principled. This avoids ad-hoc
      logic in the treatment of data family instances.
      1eed645c
    • sheaf's avatar
      Unused tyvars in FamInst: only report user tyvars · 28dd52ee
      sheaf authored and Marge Bot's avatar Marge Bot committed
      This commit changes how we perform some validity checking for
      coercion axioms to mirror how we handle default declarations for
      associated type families. This allows us to keep track of whether
      type variables in type and data family instances were user-written
      or not, in order to only report the user-written ones in
      "unused type variable" error messages.
      
      Consider for example:
      
        {-# LANGUAGE PolyKinds #-}
        type family F
        type instance forall a. F = ()
      
      In this case, we get two quantified type variables,
      (k :: Type) and (a :: k); the second being user-written, but the first
      is introduced by the typechecker. We should only report 'a' as being
      unused, as the user has no idea what 'k' is.
      
      Fixes #23734
      28dd52ee
    • sheaf's avatar
      Adjust reporting of unused tyvars in data FamInsts · a525a92a
      sheaf authored and Marge Bot's avatar Marge Bot committed
      This commit adjusts the validity checking of data family
      instances to improve the reporting of unused type variables.
      
      See Note [Out of scope tvs in data family instances] in GHC.Tc.Validity.
      
      The problem was that, in a situation such as
      
        data family D :: Type
        data instance forall (d :: Type). D = MkD
      
      the RHS passed to 'checkFamPatBinders' would be the TyCon app
      
        R:D d
      
      which mentions the type variable 'd' quantified in the user-written
      forall. Thus, when computing the set of unused type variables in
      the RHS of the data family instance, we would find that 'd' is used,
      and report a strange error message that would say that 'd' is not
      bound on the LHS.
      
      To fix this, we special-case the data-family instance case,
      manually extracting all the type variables that appear in the
      arguments of all the data constructores of the data family instance.
      
      Fixes #23778
      a525a92a
    • sheaf's avatar
      Avoid panic in mkGADTVars · aba18424
      sheaf authored and Marge Bot's avatar Marge Bot committed
      This commit avoids panicking in mkGADTVars when we encounter
      a type variable as in #23784 that is bound by a user-written
      forall but not actually used.
      
      Fixes #23784
      aba18424
    • sheaf's avatar
      Pass quantified tyvars in tcDefaultAssocDecl · 5f826c18
      sheaf authored and Marge Bot's avatar Marge Bot committed
      This commit passes the correct set of quantified type variables written
      by the user in associated type default declarations for validity
      checking. This ensures that validity checking of associated type defaults
      mirrors that of standalone type family instances.
      
      Fixes #23768 (see testcase T23734 in subsequent commit)
      5f826c18
    • jeffrey young's avatar
      compiler,ghci: error codes link to HF error index · 86d2971e
      jeffrey young authored and Marge Bot's avatar Marge Bot committed
      closes: #23259
      
      - adds -fprint-error-index-links={auto|always|never} flag
      86d2971e
    • Alexis King's avatar
      Don’t store the async exception masking state in CATCH frames · 8b61dfd6
      Alexis King authored and Marge Bot's avatar Marge Bot committed
      8b61dfd6
    • Matthew Pickering's avatar
      Add aarch64-deb11 bindist · 02c87213
      Matthew Pickering authored and Marge Bot's avatar Marge Bot committed
      This adds a debian 11 release job for aarch64.
      
      Fixes #22005
      02c87213
    • Matthew Pickering's avatar
      Add aarch64 alpine bindist · 51b57d65
      Matthew Pickering authored and Marge Bot's avatar Marge Bot committed
      This is dynamically linked and makes creating statically linked
      executables more straightforward.
      
      Fixes #23482
      51b57d65
  2. Sep 18, 2023
  3. Sep 16, 2023
  4. Sep 15, 2023
  5. Sep 14, 2023
  6. Sep 13, 2023
  7. Sep 12, 2023
  8. Sep 09, 2023
Loading