summaryrefslogtreecommitdiff
path: root/ghc/compiler/main/ErrUtils.lhs
blob: 5146016e5ccfb3beadece41eef15793e84e555b3 (plain)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
37
38
39
40
41
42
43
44
45
46
47
48
49
50
51
52
53
54
55
56
57
58
59
60
61
%
% (c) The AQUA Project, Glasgow University, 1994-1995
%
\section[ErrsUtils]{Utilities for error reporting}

This is an internal module---access to these functions is through
@Errors@.

DPH errors are in here, too.

\begin{code}
#include "HsVersions.h"

module ErrUtils where

import Bag		( Bag, bagToList )
import Outputable
import Pretty		-- to pretty-print error messages
import SrcLoc		( mkUnknownSrcLoc, SrcLoc )
import Util
\end{code}

\begin{code}
type Error = PprStyle -> Pretty

addErrLoc :: SrcLoc -> String -> Error -> Error
addErrLoc locn title rest_of_err_msg sty
  = ppHang (ppBesides [ppr PprForUser locn,
		       if null title then ppNil else ppStr (": " ++ title),
		       ppChar ':'])
    	 4 (rest_of_err_msg sty)

addShortErrLocLine :: SrcLoc -> Error -> Error
addShortErrLocLine locn rest_of_err_msg sty
  = ppHang (ppBeside (ppr PprForUser locn) (ppChar ':'))
	 4 (rest_of_err_msg sty)

dontAddErrLoc :: String -> Error -> Error
dontAddErrLoc title rest_of_err_msg sty
  = ppHang (ppBesides [ppStr title, ppChar ':'])
    	 4 (rest_of_err_msg sty)

pprBagOfErrors :: PprStyle -> Bag Error -> Pretty
pprBagOfErrors sty bag_of_errors
  = let  pretties = map ( \ e -> e sty ) (bagToList bag_of_errors)  in
    ppAboves (map (\ p -> ppAbove ppSP p) pretties)

#ifdef DPH
addWarningLoc :: SrcLoc -> Error -> Error
addWarningLoc locn rest_of_err_msg sty
  = ppHang (ppBesides [ppStr "*** Warning *** ",
		       ppr PprForUser locn,ppStr ": "])
    	 4 (ppAbove (rest_of_err_msg sty)
		    (ppSP))

addWarning :: Error -> Error
addWarning rest_of_err_msg sty
  = ppBeside (ppStr "*** Warning *** : ")
	     (rest_of_err_msg sty)
#endif {- Data Parallel Haskell -}
\end{code}