summaryrefslogtreecommitdiff
path: root/ghc/compiler/hsSyn/HsExpr.hi-boot-6
blob: 40e18ef971dfb17d1c8f4f88bb5511d1bd8e7e51 (plain)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
module HsExpr where

data HsExpr i
data HsSplice i
data MatchGroup a
data GRHSs a

type LHsExpr a = SrcLoc.Located (HsExpr a)
type SyntaxExpr a = HsExpr a
type PostTcExpr = HsExpr Var.Id

pprExpr :: (Outputable.OutputableBndr i) => 
	HsExpr.HsExpr i -> Outputable.SDoc

pprSplice :: (Outputable.OutputableBndr i) => 
	HsExpr.HsSplice i -> Outputable.SDoc

pprPatBind :: (Outputable.OutputableBndr b, Outputable.OutputableBndr i) => 
	HsPat.LPat b -> HsExpr.GRHSs i -> Outputable.SDoc

pprFunBind :: (Outputable.OutputableBndr i) => 
	i -> HsExpr.MatchGroup i -> Outputable.SDoc