summaryrefslogtreecommitdiff
path: root/ghc/compiler/deSugar/Match.lhs-boot
diff options
context:
space:
mode:
Diffstat (limited to 'ghc/compiler/deSugar/Match.lhs-boot')
-rw-r--r--ghc/compiler/deSugar/Match.lhs-boot35
1 files changed, 0 insertions, 35 deletions
diff --git a/ghc/compiler/deSugar/Match.lhs-boot b/ghc/compiler/deSugar/Match.lhs-boot
deleted file mode 100644
index 5f99f5cc1a..0000000000
--- a/ghc/compiler/deSugar/Match.lhs-boot
+++ /dev/null
@@ -1,35 +0,0 @@
-\begin{code}
-module Match where
-import Var ( Id )
-import TcType ( TcType )
-import DsMonad ( DsM, EquationInfo, MatchResult )
-import CoreSyn ( CoreExpr )
-import HsSyn ( LPat, HsMatchContext, MatchGroup )
-import Name ( Name )
-
-match :: [Id]
- -> TcType
- -> [EquationInfo]
- -> DsM MatchResult
-
-matchWrapper
- :: HsMatchContext Name
- -> MatchGroup Id
- -> DsM ([Id], CoreExpr)
-
-matchSimply
- :: CoreExpr
- -> HsMatchContext Name
- -> LPat Id
- -> CoreExpr
- -> CoreExpr
- -> DsM CoreExpr
-
-matchSinglePat
- :: CoreExpr
- -> HsMatchContext Name
- -> LPat Id
- -> TcType
- -> MatchResult
- -> DsM MatchResult
-\end{code}