Skip to content
Snippets Groups Projects
This project is mirrored from https://gitlab.haskell.org/ghc/ghc.git. Pull mirroring failed .
Repository mirroring has been paused due to too many failed attempts. It can be resumed by a project maintainer or owner.
Last successful update .
  1. Oct 05, 2019
    • Artem Pyanykh's avatar
      [linker, macho] Don't map/allocate zero size sections and segments · 0d31ccdd
      Artem Pyanykh authored and Marge Bot's avatar Marge Bot committed
      Zero size sections are common even during regular build on MacOS. For
      instance:
      
      ```
      $ ar -xv libHSghc-prim-0.6.1.a longlong.o
      $ otool -l longlong.o
      longlong.o:
      Mach header
            magic cputype cpusubtype  caps    filetype ncmds sizeofcmds      flags
       0xfeedfacf 16777223          3  0x00           1     2        176 0x00002000
      Load command 0
            cmd LC_SEGMENT_64
        cmdsize 152
        segname
         vmaddr 0x0000000000000000
         vmsize 0x0000000000000000 <-- segment size = 0
        fileoff 208
       filesize 0
        maxprot 0x00000007
       initprot 0x00000007
         nsects 1
          flags 0x0
      Section
        sectname __text
         segname __TEXT
            addr 0x0000000000000000
            size 0x0000000000000000 <-- section size = 0
          offset 208
           align 2^0 (1)
          reloff 0
          nreloc 0
           flags 0x80000000
       reserved1 0
       reserved2 0
             cmd LC_BUILD_VERSION
         cmdsize 24
        platform macos
             sdk 10.14
           minos 10.14
          ntools 0
      ```
      
      The issue of `mmap`ing 0 bytes was resolved in !1050, but the problem
      remained. These 0 size segments and sections were still allocated in
      object code, which lead to failed `ASSERT(size > 0)` in
      `addProddableBlock` further down the road.
      
      With this change zero size segments **and** sections are not
      mapped/allocated at all.
      
      Test plan:
      
      1. Build statically linked GHC.
      
      2. Run `ghc --interactive`. Observe that REPL loads
      successfully (which was not the case before).
      
      3. Load several more compiled hs files into repl. No failures.
      0d31ccdd
    • John Ericson's avatar
      Always enable the external interpreter · 0dded5ec
      John Ericson authored and Marge Bot's avatar Marge Bot committed
      You can always just not use or even build `iserv`. I don't think the
      maintenance cost of the CPP is worth...I can't even tell what the
      benefit is.
      0dded5ec
    • John Ericson's avatar
      Add tryFindTopDir to look for the top dir without blowing up if it is · eb892b28
      John Ericson authored and Marge Bot's avatar Marge Bot committed
      not found.
      eb892b28
    • John Ericson's avatar
      Pull out the settings file parsing code into it's own module. · d15b44d6
      John Ericson authored and Marge Bot's avatar Marge Bot committed
      This has two benefits:
      
      1. One less hunk of code dependent on DynFlags
      
      2. Add a little bit of error granularity to distrinugish between missing
         data and bad data. This could someday be shared with ghc-pkg which
         aims to work even with a missing file. I also am about to to make
         --supported-extensions use this too.
      d15b44d6
    • John Ericson's avatar
      Factor out a smaller part of Platform for host fallback · dd8f76b2
      John Ericson authored and Marge Bot's avatar Marge Bot committed
      dd8f76b2
    • Daroc Alden's avatar
      Deprecate -fwarn-hi-shadowing, because it was never implemented and is · b538476b
      Daroc Alden authored and Marge Bot's avatar Marge Bot committed
      not used.
      
      This fixes #10913.
      b538476b
    • John Ericson's avatar
      Remove {Build,Host}Platform_NAME from header · 75a5dd8e
      John Ericson authored and Marge Bot's avatar Marge Bot committed
      They are only used in a file we construct directly, so just skip CPP.
      75a5dd8e
    • John Ericson's avatar
      Per stage headers, ghc_boot_platform.h -> stage 0 ghcplatform.h · 05419e55
      John Ericson authored and Marge Bot's avatar Marge Bot committed
      The generated headers are now generated per stage, which means we can
      skip hacks like `ghc_boot_platform.h` and just have that be the stage 0
      header as proper. In general, stages are to be embraced: freely generate
      everything in each stage but then just build what you depend on, and
      everything is symmetrical and efficient. Trying to avoid stages because
      bootstrapping is a mind bender just creates tons of bespoke
      mini-mind-benders that add up to something far crazier.
      
      Hadrian was pretty close to this "stage-major" approach already, and so
      was fairly easy to fix. Make needed more work, however: it did know
      about stages so at least there was a scaffold, but few packages except
      for the compiler cared, and the compiler used its own counting system.
      That said, make and Hadrian now work more similarly, which is good for
      the transition to Hadrian. The merits of embracing stage aside, the
      change may be worthy for easing that transition alone.
      05419e55
    • Fumiaki Kinoshita's avatar
      Add Monad instances to `(,,) a b` and `(,,,) a b c` · ec93d2a9
      Fumiaki Kinoshita authored and Marge Bot's avatar Marge Bot committed
      ec93d2a9
  2. Oct 03, 2019
  3. Oct 01, 2019
    • Ömer Sinan Ağacan's avatar
      Make small INLINE functions behave properly · 8924224e
      Ömer Sinan Ağacan authored and Marge Bot's avatar Marge Bot committed
      Simon writes:
      
      Currently we check for a type arg rather than isTyCoArg.   This in turn
      makes INLINE things look bigger than they should be, and stops them
      being inlined into boring contexts when they perfectly well could be.
      E.g.
      
          f x = g <refl> x
          {-# INLINE g #-}
      
          ... (map (f x) xs) ...
      
      The context is boring, so don't inline unconditionally.  But f's RHS is
      no bigger than its call, provided you realise that the coercion argument
      is ultimately cost-free.
      
      This happens in practice for $WHRefl. It's not a big deal: at most it
      means we have an extra function call overhead.  But it's untidy, and
      actually worse than what happens without an INLINE pragma.
      
      Fixes #17182
      
      This makes 0.0% change in nofib binary sizes.
      8924224e
    • davide's avatar
      Hadrian: do not cache GHC configure rule · 0956c194
      davide authored and Marge Bot's avatar Marge Bot committed
      0956c194
    • davide's avatar
      Hadrian: Libffi rule now `produces` dynamic library files. · 9a27a063
      davide authored and Marge Bot's avatar Marge Bot committed
      9a27a063
    • Ryan Scott's avatar
      Refactor some cruft in TcDeriv · 9c002177
      Ryan Scott authored and Marge Bot's avatar Marge Bot committed
      * `mk_eqn_stock`, `mk_eqn_anyclass`, and `mk_eqn_no_mechanism` all
        took a continuation of type
        `DerivSpecMechanism -> DerivM EarlyDerivSpec` to represent its
        primary control flow. However, in practice this continuation was
        always instantiated with the `mk_originative_eqn` function, so
        there's not much point in making this be a continuation in the
        first place.
      
        This patch removes these continuations in favor of invoking
        `mk_originative_eqn` directly, which is simpler.
      * There were several parts of `TcDeriv` that took different code
        paths if compiling an `.hs-boot` file. But this is silly, because
        ever since 101a8c77 we simply error
        eagerly whenever attempting to derive any instances in an
        `.hs-boot` file.
      
        This patch removes all of the unnecessary `.hs-boot` code paths,
        leaving only one (which errors out).
      * Remove various error continuation arguments from `mk_eqn_stock`
        and related functions.
      9c002177
    • Sebastian Graf's avatar
      Add testcases inspired by Luke Maranget's pattern match series · 58013220
      Sebastian Graf authored
      In his paper "Warnings for Pattern Matching", Luke Maranget describes
      three series in his appendix for which GHC's pattern match checker
      scaled very badly. We mostly avoid this now with !1752. This commit adds
      regression tests for each of the series.
      
      Fixes #17264.
      58013220
    • Sebastian Graf's avatar
      Add a bunch of testcases for the pattern match checker · 6548b7b0
      Sebastian Graf authored
      Adds regression tests for tickets #17207, #17208, #17215, #17216,
       #17218, #17219, #17248
      6548b7b0
    • Ben Gamari's avatar
      Bump process submodule · 822481d5
      Ben Gamari authored and Marge Bot's avatar Marge Bot committed
      Marks process003 as fragile, as noted in #17245.
      822481d5
    • Ben Gamari's avatar
      testsuite: Mark T3389 as broken in hpc way on i386 · dbdf6a3d
      Ben Gamari authored and Marge Bot's avatar Marge Bot committed
      See #17256.
      dbdf6a3d
    • Vladislav Zavialov's avatar
      Do not rely on CUSKs in 'base' · bdba6ac2
      Vladislav Zavialov authored and Marge Bot's avatar Marge Bot committed
      Use standalone kind signatures instead of complete user-specified kinds
      in Data.Type.Equality and Data.Typeable
      bdba6ac2
    • Takenobu Tani's avatar
      testsuite: Add minimal test for :doc command · b36dd49b
      Takenobu Tani authored and Marge Bot's avatar Marge Bot committed
      Currently, there are no testcases for GHCi `:doc` command.
      Perhaps because it was experimental. And it could be changed in the future.
      
      But `:doc` command is already useful, so I add a minimal regression test
      to keep current behavior.
      
      See also 85309a3c for implementation of `:doc` command.
      b36dd49b
    • Sebastian Graf's avatar
      Move pattern match checker modules to GHC.HsToCore.PmCheck · 6f8550a3
      Sebastian Graf authored and Marge Bot's avatar Marge Bot committed
      6f8550a3
    • Takenobu Tani's avatar
      Add help message for GHCi :instances command · 97811ef5
      Takenobu Tani authored and Marge Bot's avatar Marge Bot committed
      This commit updates GHCi's help message for GHC 8.10.
      97811ef5
    • Simon Peyton Jones's avatar
      Fix arguments for unbound binders in RULE application · 6a1700aa
      Simon Peyton Jones authored and Marge Bot's avatar Marge Bot committed
      We were failing to correctly implement Note [Unbound RULE binders]
      in Rules.hs.  In particular, when cooking up a fake Refl,
      were were failing to apply the substitition.
      
      This patch fixes that problem, and simultaneously tidies
      up the impedence mis-match between RuleSubst and TCvSubst.
      
      Thanks to Sebastian!
      6a1700aa
    • Ömer Sinan Ağacan's avatar
      Refactor iface file generation: · f3cb8c7c
      Ömer Sinan Ağacan authored and Marge Bot's avatar Marge Bot committed
      
      This commit refactors interface file generation to allow information
      from the later passed (NCG, STG) to be stored in interface files.
      
      We achieve this by splitting interface file generation into two parts:
      * Partial interfaces, built based on the result of the core pipeline
      * A fully instantiated interface, which also contains the final
      fingerprints and can optionally contain information produced by the backend.
      
      This change is required by !1304 and !1530.
      
      -dynamic-too handling is refactored too: previously when generating code
      we'd branch on -dynamic-too *before* code generation, but now we do it
      after.
      
      (Original code written by @AndreasK in !1530)
      
      Performance
      ~~~~~~~~~~~
      
      Before this patch interface files where created and immediately flushed
      to disk which made space leaks impossible.
      With this change we instead use NFData to force all iface related data
      structures to avoid space leaks.
      
      In the process of refactoring it was discovered that the code in the
      ToIface Module allocated a lot of thunks which were immediately forced
      when writing/forcing the interface file. So we made this module more
      strict to avoid creating many of those thunks.
      
      Bottom line is that allocations go down by about ~0.1% compared to
      master.
      Residency is not meaningfully different after this patch.
      Runtime was not benchmarked.
      
      Co-Authored-By: default avatarAndreas Klebinger <klebinger.andreas@gmx.at>
      Co-Authored-By: default avatarÖmer Sinan Ağacan <omer@well-typed.com>
      f3cb8c7c
  4. Sep 28, 2019
    • Sebastian Graf's avatar
      `exprOkForSpeculation` for Note [IO hack in the demand analyser] · ce64b397
      Sebastian Graf authored and Marge Bot's avatar Marge Bot committed
      In #14998 I realised that the notion of speculative execution
      *exactly matches* eager evaluation of expressions in a case alternative
      where the scrutinee is an IO action.
      
      Normally we have to `deferIO` any result from that single case
      alternative to prevent this speculative execution, so we had a special
      case in place in the demand analyser that would check if the scrutinee
      was a prim-op, in which case we assumed that it would be ok to do the
      eager evaluation.
      
      Now we just check if the scrutinee is `exprOkForSpeculation`,
      corresponding to the notion that we want to push evaluation of the
      scrutinee *after* eagerly evaluating stuff from the case alternative.
      
      This fixes #14988, because it resolves the last open Item 4 there.
      ce64b397
    • Sebastian Graf's avatar
      PmCheck: No ConLike instantiation in pmcheck · c5d888d4
      Sebastian Graf authored and Marge Bot's avatar Marge Bot committed
      `pmcheck` used to call `refineToAltCon` which would refine the knowledge
      we had about a variable by equating it to a `ConLike` application.
      Since we weren't particularly smart about this in the Check module, we
      simply freshened the constructors existential and term binders utimately
      through a call to `mkOneConFull`.
      
      But that instantiation is unnecessary for when we match against a
      concrete pattern! The pattern will already have fresh binders and field
      types. So we don't call `refineToAltCon` from `Check` anymore.
      
      Subsequently, we can simplify a couple of call sites and functions in
      `PmOracle`. Also implementing `computeCovered` becomes viable and we
      don't have to live with the hack that was `addVarPatVecCt` anymore.
      
      A side-effect of not indirectly calling `mkOneConFull` anymore is that
      we don't generate the proper strict argument field constraints anymore.
      Instead we now desugar ConPatOuts as if they had bangs on their strict
      fields. This implies that `PmVar` now carries a `HsImplBang` that we
      need to respect by a (somewhat ephemeral) non-void check. We fix #17234
      in doing so.
      c5d888d4
Loading