2 % (c) The University of Glasgow 2006
3 % (c) The GRASP/AQUA Project, Glasgow University, 1992-1998
6 Matching guarded right-hand-sides (GRHSs)
9 module DsGRHSs ( dsGuarded, dsGRHSs ) where
11 #include "HsVersions.h"
13 import {-# SOURCE #-} DsExpr ( dsLExpr, dsLocalBinds )
14 import {-# SOURCE #-} Match ( matchSinglePat )
31 @dsGuarded@ is used for both @case@ expressions and pattern bindings.
39 producing an expression with a runtime error in the corner if
40 necessary. The type argument gives the type of the @ei@.
43 dsGuarded :: GRHSs Id -> Type -> DsM CoreExpr
45 dsGuarded grhss rhs_ty
46 = dsGRHSs PatBindRhs [] grhss rhs_ty `thenDs` \ match_result ->
47 mkErrorAppDs nON_EXHAUSTIVE_GUARDS_ERROR_ID rhs_ty "" `thenDs` \ error_expr ->
48 extractMatchResult match_result error_expr
51 In contrast, @dsGRHSs@ produces a @MatchResult@.
54 dsGRHSs :: HsMatchContext Name -> [Pat Id] -- These are to build a MatchContext from
55 -> GRHSs Id -- Guarded RHSs
56 -> Type -- Type of RHS
58 dsGRHSs hs_ctx pats grhssa@(GRHSs grhss binds) rhs_ty = do
59 match_results <- mappM (dsGRHS hs_ctx pats rhs_ty) grhss
61 match_result1 = foldr1 combineMatchResults match_results
62 match_result2 = adjustMatchResultDs
63 (\e -> dsLocalBinds binds e)
65 -- NB: nested dsLet inside matchResult
67 returnDs match_result2
69 dsGRHS hs_ctx pats rhs_ty (L loc (GRHS guards rhs))
70 = matchGuards (map unLoc guards) hs_ctx rhs rhs_ty
74 %************************************************************************
76 %* matchGuard : make a MatchResult from a guarded RHS *
78 %************************************************************************
81 matchGuards :: [Stmt Id] -- Guard
82 -> HsMatchContext Name -- Context
84 -> Type -- Type of RHS of guard
87 -- See comments with HsExpr.Stmt re what an ExprStmt means
88 -- Here we must be in a guard context (not do-expression, nor list-comp)
90 matchGuards [] ctx rhs rhs_ty
91 = do { core_rhs <- dsLExpr rhs
92 ; return (cantFailMatchResult core_rhs) }
94 -- ExprStmts must be guards
95 -- Turn an "otherwise" guard is a no-op. This ensures that
96 -- you don't get a "non-exhaustive eqns" message when the guards
97 -- finish in "otherwise".
98 -- NB: The success of this clause depends on the typechecker not
99 -- wrapping the 'otherwise' in empty HsTyApp or HsWrap constructors
100 -- If it does, you'll get bogus overlap warnings
101 matchGuards (ExprStmt (L _ (HsVar v)) _ _ : stmts) ctx rhs rhs_ty
102 | v `hasKey` otherwiseIdKey
103 || v `hasKey` getUnique trueDataConId
104 -- trueDataConId doesn't have the same unique as trueDataCon
105 = matchGuards stmts ctx rhs rhs_ty
107 matchGuards (ExprStmt expr _ _ : stmts) ctx rhs rhs_ty
108 = matchGuards stmts ctx rhs rhs_ty `thenDs` \ match_result ->
109 dsLExpr expr `thenDs` \ pred_expr ->
110 returnDs (mkGuardedMatchResult pred_expr match_result)
112 matchGuards (LetStmt binds : stmts) ctx rhs rhs_ty
113 = matchGuards stmts ctx rhs rhs_ty `thenDs` \ match_result ->
114 returnDs (adjustMatchResultDs (dsLocalBinds binds) match_result)
115 -- NB the dsLet occurs inside the match_result
116 -- Reason: dsLet takes the body expression as its argument
117 -- so we can't desugar the bindings without the
118 -- body expression in hand
120 matchGuards (BindStmt pat bind_rhs _ _ : stmts) ctx rhs rhs_ty
121 = matchGuards stmts ctx rhs rhs_ty `thenDs` \ match_result ->
122 dsLExpr bind_rhs `thenDs` \ core_rhs ->
123 matchSinglePat core_rhs ctx pat rhs_ty match_result
126 Should {\em fail} if @e@ returns @D@
128 f x | p <- e', let C y# = e, f y# = r1