Skip to content
Snippets Groups Projects
  1. Jan 04, 2013
    • twanvl's avatar
      Changed deriving of Functor, Foldable, Traversable to fix #7436. Added foldMap... · 49ca2a37
      twanvl authored
      Changed deriving of Functor, Foldable, Traversable to fix #7436. Added foldMap to derived Foldable instance.
      
      The derived instances will no longer eta-expand the function. I.e. instead of
          fmap f (Foo a) = Foo (fmap (\x -> f x) a)
      we now derive
          fmap f (Foo a) = Foo (fmap f a)
      
      Some superflous lambdas are generated as a result. For example
          data X a = X (a,a)
          fmap f (X x) = (\y -> case y of (a,b) -> (f a, f b)) x
      The optimizer should be able to simplify this code, as it is just beta reduction.
      
      The derived Foldable instance now includes foldMap in addition to foldr.
      49ca2a37
    • Simon Peyton Jones's avatar
    • Simon Peyton Jones's avatar
      Switch on -XEmptyCase when renaming derived declarations · 74d40186
      Simon Peyton Jones authored
      Compiler-generated code can have empty cases
      74d40186
    • Simon Peyton Jones's avatar
      Add an ASSERT · e52d9d46
      Simon Peyton Jones authored
      e52d9d46
    • Simon Peyton Jones's avatar
      Refactor HsExpr.MatchGroup · a8941e2a
      Simon Peyton Jones authored
       * Make MatchGroup into a record, and use the record fields
      
       * Split the type field into two: mg_arg_tys and mg_res_ty
         This makes life much easier for the desugarer when the
         case alterantives are empty
      
      A little bit of this change unavoidably ended up in the preceding
      commit about empty case alternatives
      a8941e2a
    • Simon Peyton Jones's avatar
      Allow empty case expressions (and lambda-case) with -XEmptyCase · 3671e674
      Simon Peyton Jones authored
      The main changes are:
        * Parser accepts empty case alternatives
        * Renamer checks that -XEmptyCase is on in that case
        * (Typechecker is pretty much unchanged.)
        * Desugarer desugars empty case alternatives, esp:
            - Match.matchWrapper and Match.match now accept empty eqns
            - New function matchEmpty deals with the empty case
            - See Note [Empty case alternatives] in Match
      
      This patch contains most of the work, but it's a bit mixed up
      with a refactoring of MatchGroup that I did at the same time
      (next commit).
      3671e674
    • Simon Peyton Jones's avatar
      Make CaseElim a bit less aggressive · 28d9a032
      Simon Peyton Jones authored
      See Note [Case elimination: lifted case]:
      
      We used to do case elimination if
              (c) the scrutinee is a variable and 'x' is used strictly
      But that changes
          case x of { _ -> error "bad" }
          --> error "bad"
      which is very puzzling if 'x' is later bound to (error "good").
      Where the order of evaluation is specified (via seq or case)
      we should respect it.
      
      c.f. Note [Empty case alternatives] in CoreSyn, which is how
      I came across this.
      28d9a032
    • Ian Lynagh's avatar
      Set DBLATEX_OPTS to -P 'filename.as.url=0' (fixes #7486) · d9674323
      Ian Lynagh authored
      Apparently this fixes the build with dblatex 0.3.4.
      d9674323
  2. Jan 03, 2013
  3. Jan 02, 2013
  4. Jan 01, 2013
    • Simon Peyton Jones's avatar
      Make the comments about SingI and EvLit match current reality · 215cf423
      Simon Peyton Jones authored
      See Note [SingI and EvLit] in TcEvidence.
      215cf423
    • Simon Peyton Jones's avatar
      Comments and white space only · b43fdcfe
      Simon Peyton Jones authored
      b43fdcfe
    • Simon Peyton Jones's avatar
      Refactor the invariants for ClsInsts · 5efe9b11
      Simon Peyton Jones authored
      We now have the invariant for a ClsInst that the is_tvs field
      is always completely fresh type variables. See
      Note [Template tyvars are fresh] in InstEnv.
      
      (Previously we frehened them when extending the instance environment,
      but that seems messier because it was an invariant only when the
      ClsInst was in an InstEnv.  Moreover, there was an invariant that
      thet tyvars of the DFunid in the ClsInst had to match, and I have
      removed that invariant altogether; there is no need for it.)
      
      Other changes I made at the same time:
      
       * Make is_tvs into a *list*, in the right order for the dfun type
         arguments.  This removes the wierd need for the dfun to have the
         same tyvars as the ClsInst template, an invariant I have always
         hated. The cost is that we need to make it a VarSet when matching.
         We could cache an is_tv_set instead.
      
       * Add a cached is_cls field to the ClsInst, to save fishing
         the Class out of the DFun.  (Renamed is_cls to is_cls_nm.)
      
       * Make tcSplitDFunTy return the dfun args, not just the *number*
         of dfun args
      
       * Make InstEnv.instanceHead return just the *head* of the
         instance declaration.  Add instanceSig to return the whole
         thing.
      5efe9b11
    • Simon Peyton Jones's avatar
      Fix typo in comment (Trac #7526) · 18003c9e
      Simon Peyton Jones authored
      18003c9e
    • Ben Millwood's avatar
      Remove references to GHC 6.6 in docs · 9929172c
      Ben Millwood authored
      9929172c
    • Ian Lynagh's avatar
  5. Dec 29, 2012
    • Iavor S. Diatchki's avatar
      Fix dictionaries for SingI. · 45279919
      Iavor S. Diatchki authored
      This adds the missing coercions in the constructed evidence for SingI.
      Previously we simply passed an integer or a string for the evidence,
      which was not quite correct and causes errors when the core lint is
      enabled.   This patch corrects this by inserting the necessary
      coercions.
      45279919
  6. Dec 24, 2012
    • Simon Peyton Jones's avatar
      Make the treatment of addAltUnfoldings handle casts · 545fd8b9
      Simon Peyton Jones authored
      This minor refactoring re-attaches Note [Add unfolding for scrutinee].
      It had become detached, which led me on a bit of a wild goose
      chase.
      
      While I was at it, I made the code work right for the case where
      the scrutinee is of form (x |> co); I don't think this is an important
      improvement.
      
      I also make simplAlt unconditionally zap occurrence information on
      case-alternative binders (see Note [Case alternative occ info]);
      it was almost always being zapped and the additional complexity seems
      not worth it.
      545fd8b9
    • Simon Peyton Jones's avatar
      Make combine-identical-alternatives work again (Trac #7360) · bacf7ca0
      Simon Peyton Jones authored
      Move the "combine indentical alternatives" transformation *before*
      simplifying the alternatives.  For example
           case x of y
              [] -> length y
              (_:_) -> length y }
      
      If we look *post* simplification, since 'y' is used in the
      alterantives, the case binders *might* be (see the keep_occ_info test
      in Simplify.simplAlt); and hence the combination of the two
      alteranatives does not happen.  But if we do it *pre* simplification
      there is no problem.
      
      This fixes Trac #7360.
      bacf7ca0
    • Simon Peyton Jones's avatar
Loading