[project @ 1999-01-28 17:10:52 by simonpj]
[ghc-hetmet.git] / ghc / compiler / basicTypes / OccName.lhs
1
2 % (c) The GRASP/AQUA Project, Glasgow University, 1992-1998
3 %
4
5 \section[OccName]{@OccName@}
6
7 \begin{code}
8 module OccName (
9         -- Modules
10         Module,         -- Abstract, instance of Outputable
11         mkSrcModule, mkSrcModuleFS, mkSysModuleFS, mkImportModuleFS, mkBootModule, mkIfaceModuleFS,
12         moduleString, moduleUserString, moduleIfaceFlavour,
13         pprModule, pprModuleSep, pprModuleBoot,
14
15         -- IfaceFlavour
16         IfaceFlavour,
17         hiFile, hiBootFile, bootFlavour,
18
19         -- The NameSpace type; abstact
20         NameSpace, tcName, clsName, tcClsName, dataName, varName, tvName,
21         nameSpaceString, 
22
23         -- The OccName type
24         OccName,        -- Abstract, instance of Outputable
25         pprOccName, 
26
27         mkSrcOccFS, mkSysOcc, mkSysOccFS, mkSrcVarOcc, mkKindOccFS,
28         mkSuperDictSelOcc, mkDFunOcc, mkForeignExportOcc,
29         mkDictOcc, mkWorkerOcc, mkMethodOcc, mkDefaultMethodOcc,
30         mkClassTyConOcc, mkClassDataConOcc, mkSpecOcc,
31         
32         isTvOcc, isDataOcc, isDataSymOcc, isSymOcc,
33
34         occNameFS, occNameString, occNameUserString, occNameSpace, occNameFlavour, 
35         setOccNameSpace,
36
37         -- Tidying up
38         TidyOccEnv, emptyTidyOccEnv, tidyOccName, initTidyOccEnv,
39
40         -- Encoding
41         EncodedString, EncodedFS, UserString, UserFS, encode, encodeFS, decode,
42
43         -- The basic form of names
44         isLexCon, isLexVar, isLexId, isLexSym,
45         isLexConId, isLexConSym, isLexVarId, isLexVarSym,
46         isLowerISO, isUpperISO
47
48     ) where
49
50 #include "HsVersions.h"
51
52 import Char     ( isDigit, isAlpha, isUpper, isLower, ISALPHANUM, ord, chr, digitToInt, intToDigit )
53 import Util     ( thenCmp )
54 import FiniteMap ( FiniteMap, emptyFM, lookupFM, addToFM, elemFM )
55 import Outputable
56 import GlaExts
57 \end{code}
58
59 We hold both module names and identifier names in a 'Z-encoded' form
60 that makes them acceptable both as a C identifier and as a Haskell
61 (prefix) identifier. 
62
63 They can always be decoded again when printing error messages
64 or anything else for the user, but it does make sense for it
65 to be represented here in encoded form, so that when generating
66 code the encoding operation is not performed on each occurrence.
67
68 These type synonyms help documentation.
69
70 \begin{code}
71 type UserFS     = FAST_STRING   -- As the user typed it
72 type EncodedFS = FAST_STRING    -- Encoded form
73
74 type UserString = String        -- As the user typed it
75 type EncodedString = String     -- Encoded form
76
77
78 pprEncodedFS :: EncodedFS -> SDoc
79 pprEncodedFS fs
80   = getPprStyle         $ \ sty ->
81     if userStyle sty then
82         text (decode (_UNPK_ fs))
83     else
84         ptext fs
85 \end{code}
86
87
88 %************************************************************************
89 %*                                                                      *
90 \subsection{Interface file flavour}
91 %*                                                                      *
92 %************************************************************************
93
94 The IfaceFlavour type is used mainly in an imported Name's Provenance
95 to say whether the name comes from a regular .hi file, or whether it comes
96 from a hand-written .hi-boot file.  This is important, because it has to be 
97 propagated.  Suppose
98
99         C.hs imports B
100         B.hs imports A
101         A.hs imports C {-# SOURCE -#} ( f )
102
103 Then in A.hi we may mention C.f, in an inlining.  When compiling B we *must not* 
104 read C.f's details from C.hi, even if the latter happens to exist from an earlier
105 compilation run.  So we use the name "C!f" in A.hi, and when looking for an interface
106 file with details of C!f we look in C.hi-boot.  The "!" stuff is recorded in the
107 IfaceFlavour in the Module of C.f in A. 
108
109 Not particularly beautiful, but it works.
110
111 \begin{code}
112 data IfaceFlavour = HiFile              -- The thing comes from a standard interface file
113                                         -- or from the source file itself
114                   | HiBootFile          -- ... or from a handwritten "hi-boot" interface file
115                   deriving( Eq )
116
117 hiFile     = HiFile
118 hiBootFile = HiBootFile
119
120 instance Text IfaceFlavour where        -- Just used in debug prints of lex tokens
121   showsPrec n HiFile     s = s
122   showsPrec n HiBootFile s = "!" ++ s
123
124 bootFlavour :: IfaceFlavour -> Bool
125 bootFlavour HiBootFile = True
126 bootFlavour HiFile     = False
127 \end{code}
128
129
130 %************************************************************************
131 %*                                                                      *
132 \subsection[Module]{The name of a module}
133 %*                                                                      *
134 %************************************************************************
135
136 \begin{code}
137 data Module = Module
138                 EncodedFS
139                 IfaceFlavour
140         -- Haskell module names can include the quote character ',
141         -- so the module names have the z-encoding applied to them
142 \end{code}
143
144 \begin{code}
145 instance Outputable Module where
146   ppr = pprModule
147
148 -- Ignore the IfaceFlavour when comparing modules
149 instance Eq Module where
150   (Module m1 _) == (Module m2 _) = m1 == m2
151
152 instance Ord Module where
153   (Module m1 _) `compare` (Module m2 _) = m1 `compare` m2
154 \end{code}
155
156
157 \begin{code}
158 pprModule :: Module -> SDoc
159 pprModule (Module mod _) = pprEncodedFS mod
160
161 pprModuleSep, pprModuleBoot :: Module -> SDoc
162 pprModuleSep (Module mod HiFile)     = dot
163 pprModuleSep (Module mod HiBootFile) = char '!'
164
165 pprModuleBoot (Module mod HiFile)     = empty
166 pprModuleBoot (Module mod HiBootFile) = char '!'
167 \end{code}
168
169
170 \begin{code}
171 mkSrcModule :: UserString -> Module
172 mkSrcModule s = Module (_PK_ (encode s)) HiFile
173
174 mkSrcModuleFS :: UserFS -> Module
175 mkSrcModuleFS s = Module (encodeFS s) HiFile
176
177 mkImportModuleFS :: UserFS -> IfaceFlavour -> Module
178 mkImportModuleFS s hif = Module (encodeFS s) hif
179
180 mkSysModuleFS :: EncodedFS -> IfaceFlavour -> Module
181 mkSysModuleFS s hif = Module s hif
182
183 mkIfaceModuleFS :: EncodedFS -> Module
184 mkIfaceModuleFS s = Module s HiFile
185
186 mkBootModule :: Module -> Module
187 mkBootModule (Module s _) = Module s HiBootFile
188
189 moduleString :: Module -> EncodedString
190 moduleString (Module mod _) = _UNPK_ mod
191
192 moduleUserString :: Module -> UserString
193 moduleUserString (Module mod _) = decode (_UNPK_ mod)
194
195 moduleIfaceFlavour :: Module -> IfaceFlavour
196 moduleIfaceFlavour (Module _ hif) = hif
197 \end{code}
198
199
200 %************************************************************************
201 %*                                                                      *
202 \subsection{Name space}
203 %*                                                                      *
204 %************************************************************************
205
206 \begin{code}
207 data NameSpace = VarName        -- Variables
208                | DataName       -- Data constructors
209                | TvName         -- Type variables
210                | TcClsName      -- Type constructors and classes; Haskell has them
211                                 -- in the same name space for now.  
212                deriving( Eq, Ord )
213
214 -- Though type constructors and classes are in the same name space now,
215 -- the NameSpace type is abstract, so we can easily separate them later
216 tcName    = TcClsName           -- Type constructors
217 clsName   = TcClsName           -- Classes
218 tcClsName = TcClsName           -- Not sure which!
219
220 dataName = DataName
221 tvName   = TvName
222 varName  = VarName
223
224
225 nameSpaceString :: NameSpace -> String
226 nameSpaceString DataName  = "Data constructor"
227 nameSpaceString VarName   = "Variable"
228 nameSpaceString TvName    = "Type variable"
229 nameSpaceString TcClsName = "Type constructor or class"
230 \end{code}
231
232
233 %************************************************************************
234 %*                                                                      *
235 \subsection[Name-pieces-datatypes]{The @OccName@ datatypes}
236 %*                                                                      *
237 %************************************************************************
238
239 \begin{code}
240 data OccName = OccName 
241                         NameSpace
242                         EncodedFS
243 \end{code}
244
245
246 \begin{code}
247 instance Eq OccName where
248     (OccName sp1 s1) == (OccName sp2 s2) = s1 == s2 && sp1 == sp2
249
250 instance Ord OccName where
251     compare (OccName sp1 s1) (OccName sp2 s2) = (s1  `compare` s2) `thenCmp`
252                                                 (sp1 `compare` sp2)
253 \end{code}
254
255
256 %************************************************************************
257 %*                                                                      *
258 \subsection{Printing}
259 %*                                                                      *
260 %************************************************************************
261  
262 \begin{code}
263 instance Outputable OccName where
264     ppr = pprOccName
265
266 pprOccName :: OccName -> SDoc
267 pprOccName (OccName sp occ) = pprEncodedFS occ
268 \end{code}
269
270
271 %************************************************************************
272 %*                                                                      *
273 \subsection{Construction}
274 %*                                                                      *
275 %************************************************************************
276
277 *Sys* things do no encoding; the caller should ensure that the thing is
278 already encoded
279
280 \begin{code}
281 mkSysOcc :: NameSpace -> EncodedString -> OccName
282 mkSysOcc occ_sp str = ASSERT( alreadyEncoded str )
283                       OccName occ_sp (_PK_ str)
284
285 mkSysOccFS :: NameSpace -> EncodedFS -> OccName
286 mkSysOccFS occ_sp fs = ASSERT2( alreadyEncodedFS fs, ppr fs )
287                        OccName occ_sp fs
288
289 -- Kind constructors get a speical function.  Uniquely, they are not encoded,
290 -- so that they have names like '*'.  This means that *even in interface files*
291 -- we'll get kinds like (* -> (* -> *)).  We can't use mkSysOcc because it
292 -- has an ASSERT that doesn't hold.
293 mkKindOccFS :: NameSpace -> EncodedFS -> OccName
294 mkKindOccFS occ_sp fs = OccName occ_sp fs
295 \end{code}
296
297 *Source-code* things are encoded.
298
299 \begin{code}
300 mkSrcOccFS :: NameSpace -> UserFS -> OccName
301 mkSrcOccFS occ_sp fs = mkSysOccFS occ_sp (encodeFS fs)
302
303 mkSrcVarOcc :: UserFS -> OccName
304 mkSrcVarOcc fs = mkSysOccFS varName (encodeFS fs)
305 \end{code}
306
307
308
309 %************************************************************************
310 %*                                                                      *
311 \subsection{Predicates and taking them apart}
312 %*                                                                      *
313 %************************************************************************
314
315 \begin{code} 
316 occNameFS :: OccName -> EncodedFS
317 occNameFS (OccName _ s) = s
318
319 occNameString :: OccName -> EncodedString
320 occNameString (OccName _ s) = _UNPK_ s
321
322 occNameUserString :: OccName -> UserString
323 occNameUserString occ = decode (occNameString occ)
324
325 occNameSpace :: OccName -> NameSpace
326 occNameSpace (OccName sp _) = sp
327
328 setOccNameSpace :: OccName -> NameSpace -> OccName
329 setOccNameSpace (OccName _ occ) sp = OccName sp occ
330
331 -- occNameFlavour is used only to generate good error messages
332 occNameFlavour :: OccName -> String
333 occNameFlavour (OccName sp _) = nameSpaceString sp
334 \end{code}
335
336 \begin{code}
337 isTvOcc, isDataSymOcc, isSymOcc :: OccName -> Bool
338
339 isTvOcc (OccName TvName _) = True
340 isTvOcc other              = False
341
342 -- Data constructor operator (starts with ':', or '[]')
343 -- Pretty inefficient!
344 isDataSymOcc (OccName DataName s) = isLexConSym (decodeFS s)
345 isDataSymOcc other                = False
346
347 isDataOcc (OccName DataName _) = True
348 isDataOcc oter                 = False
349
350 -- Any operator (data constructor or variable)
351 -- Pretty inefficient!
352 isSymOcc (OccName DataName s) = isLexConSym (decodeFS s)
353 isSymOcc (OccName VarName s)  = isLexSym (decodeFS s)
354 \end{code}
355
356
357 %************************************************************************
358 %*                                                                      *
359 \subsection{Making system names}
360 %*                                                                      *
361 %************************************************************************
362
363 Here's our convention for splitting up the interface file name space:
364
365         d...            dictionary identifiers
366                         (local variables, so no name-clash worries)
367
368         $f...           dict-fun identifiers (from inst decls)
369         $m...           default methods
370         $p...           superclass selectors
371         $w...           workers
372         $T...           compiler-generated tycons for dictionaries
373         $D...           ...ditto data cons
374         $sf..           specialised version of f
375
376         in encoded form these appear as Zdfxxx etc
377
378         :...            keywords (export:, letrec: etc.)
379
380 This knowledge is encoded in the following functions.
381
382
383 @mk_deriv@ generates an @OccName@ from the one-char prefix and a string.
384 NB: The string must already be encoded!
385
386 \begin{code}
387 mk_deriv :: NameSpace 
388          -> String              -- Distinguishes one sort of derived name from another
389          -> EncodedString       -- Must be already encoded!!  We don't want to encode it a 
390                                 -- second time because encoding isn't itempotent
391          -> OccName
392
393 mk_deriv occ_sp sys_prefix str = mkSysOcc occ_sp (encode sys_prefix ++ str)
394 \end{code}
395
396 \begin{code}
397 mkDictOcc, mkWorkerOcc, mkDefaultMethodOcc,
398            mkClassTyConOcc, mkClassDataConOcc, mkSpecOcc
399    :: OccName -> OccName
400
401 -- These derived variables have a prefix that no Haskell value could have
402 mkWorkerOcc        = mk_simple_deriv varName  "$w"
403 mkDefaultMethodOcc = mk_simple_deriv varName  "$dm"
404 mkClassTyConOcc    = mk_simple_deriv tcName   ":T"      -- The : prefix makes sure it classifies
405 mkClassDataConOcc  = mk_simple_deriv dataName ":D"      -- as a tycon/datacon
406 mkDictOcc          = mk_simple_deriv varName  "$d"
407 mkSpecOcc          = mk_simple_deriv varName  "$s"
408 mkForeignExportOcc = mk_simple_deriv varName  "$f"
409
410 mk_simple_deriv sp px occ = mk_deriv sp px (occNameString occ)
411 \end{code}
412
413 \begin{code}
414 mkSuperDictSelOcc :: Int        -- Index of superclass, eg 3
415                   -> OccName    -- Class, eg "Ord"
416                   -> OccName    -- eg "p3Ord"
417 mkSuperDictSelOcc index cls_occ
418   = mk_deriv varName "$p" (show index ++ occNameString cls_occ)
419 \end{code}
420
421
422 \begin{code}
423 mkDFunOcc :: OccName    -- class, eg "Ord"
424           -> OccName    -- tycon (or something convenient from the instance type)
425                         --      eg "Maybe"
426           -> Int        -- Unique to distinguish dfuns which share the previous two
427                         --      eg 3
428           -> OccName    -- "dOrdMaybe3"
429
430 mkDFunOcc cls_occ tycon_occ index
431   = mk_deriv VarName "$f" (show_index ++ cls_str ++ tycon_str)
432   where
433     cls_str   = occNameString cls_occ
434     tycon_str = occNameString tycon_occ
435     show_index | index == 0 = ""
436                | otherwise  = show index
437 \end{code}
438
439 We used to add a '$m' to indicate a method, but that gives rise to bad
440 error messages from the type checker when we print the function name or pattern
441 of an instance-decl binding.  Why? Because the binding is zapped
442 to use the method name in place of the selector name.
443 (See TcClassDcl.tcMethodBind)
444
445 The way it is now, -ddump-xx output may look confusing, but
446 you can always say -dppr-debug to get the uniques.
447
448 However, we *do* have to zap the first character to be lower case,
449 because overloaded constructors (blarg) generate methods too.
450 And convert to VarName space
451
452 e.g. a call to constructor MkFoo where
453         data (Ord a) => Foo a = MkFoo a
454
455 If this is necessary, we do it by prefixing '$m'.  These 
456 guys never show up in error messages.  What a hack.
457
458 \begin{code}
459 mkMethodOcc :: OccName -> OccName
460 mkMethodOcc occ@(OccName VarName fs) = occ
461 mkMethodOcc occ                      = mk_simple_deriv varName "$m" occ
462 \end{code}
463
464
465 %************************************************************************
466 %*                                                                      *
467 \subsection{Tidying them up}
468 %*                                                                      *
469 %************************************************************************
470
471 Before we print chunks of code we like to rename it so that
472 we don't have to print lots of silly uniques in it.  But we mustn't
473 accidentally introduce name clashes!  So the idea is that we leave the
474 OccName alone unless it accidentally clashes with one that is already
475 in scope; if so, we tack on '1' at the end and try again, then '2', and
476 so on till we find a unique one.
477
478 There's a wrinkle for operators.  Consider '>>='.  We can't use '>>=1' 
479 because that isn't a single lexeme.  So we encode it to 'lle' and *then*
480 tack on the '1', if necessary.
481
482 \begin{code}
483 type TidyOccEnv = FiniteMap FAST_STRING Int     -- The in-scope OccNames
484 emptyTidyOccEnv = emptyFM
485
486 initTidyOccEnv :: [OccName] -> TidyOccEnv       -- Initialise with names to avoid!
487 initTidyOccEnv = foldl (\env (OccName _ fs) -> addToFM env fs 1) emptyTidyOccEnv
488
489 tidyOccName :: TidyOccEnv -> OccName -> (TidyOccEnv, OccName)
490
491 tidyOccName in_scope occ@(OccName occ_sp fs)
492   | not (fs `elemFM` in_scope)
493   = (addToFM in_scope fs 1, occ)        -- First occurrence
494
495   | otherwise                           -- Already occurs
496   = go in_scope (_UNPK_ fs)
497   where
498
499     go in_scope str = case lookupFM in_scope pk_str of
500                         Just n  -> go (addToFM in_scope pk_str (n+1)) (str ++ show n)
501                                 -- Need to go round again, just in case "t3" (say) 
502                                 -- clashes with a "t3" that's already in scope
503
504                         Nothing -> (addToFM in_scope pk_str 1, mkSysOccFS occ_sp pk_str)
505                                 -- str is now unique
506                     where
507                       pk_str = _PK_ str
508 \end{code}
509
510
511 %************************************************************************
512 %*                                                                      *
513 \subsection{The 'Z' encoding}
514 %*                                                                      *
515 %************************************************************************
516
517 This is the main name-encoding and decoding function.  It encodes any
518 string into a string that is acceptable as a C name.  This is the name
519 by which things are known right through the compiler.
520
521 The basic encoding scheme is this.  
522
523 * Tuples (,,,) are coded as Z3T
524
525 * Alphabetic characters (upper and lower), digits, and '_'
526         all translate to themselves; 
527         except 'Z', which translates to 'ZZ'
528         and    'z', which translates to 'zz'
529   We need both so that we can preserve the variable/tycon distinction
530
531 * Most other printable characters translate to 'Zx' for some
532         alphabetic character x
533
534 * The others translate as 'Zxdd' where 'dd' is exactly two hexadecimal
535         digits for the ord of the character
536
537         Before          After
538         --------------------------
539         Trak            Trak
540         foo_wib         foo_wib
541         >               Zg
542         >1              Zg1
543         foo#            fooZh
544         foo##           fooZhZh
545         foo##1          fooZhXh1
546         fooZ            fooZZ   
547         :+              ZcZp
548         ()              Z0T
549         (,,,,)          Z4T
550
551
552 \begin{code}
553 -- alreadyEncoded is used in ASSERTs to check for encoded
554 -- strings.  It isn't fail-safe, of course, because, say 'zh' might
555 -- be encoded or not.
556 alreadyEncoded :: String -> Bool
557 alreadyEncoded s = all ok s
558                  where
559                    ok '_' = True
560                    ok ch  = ISALPHANUM ch
561
562 alreadyEncodedFS :: FAST_STRING -> Bool
563 alreadyEncodedFS fs = alreadyEncoded (_UNPK_ fs)
564
565 encode :: UserString -> EncodedString
566 encode cs = case maybe_tuple cs of
567                 Just n  -> 'Z' : show n ++ "T"          -- Tuples go to Z2T etc
568                 Nothing -> go cs
569           where
570                 go []     = []
571                 go (c:cs) = encode_ch c ++ go cs
572
573 -- ToDo: Unboxed tuples too, perhaps?
574 maybe_tuple ('(' : cs) = check_tuple 0 cs
575 maybe_tuple other      = Nothing
576
577 check_tuple n (',' : cs) = check_tuple (n+1) cs
578 check_tuple n ")"        = Just n
579 check_tuple n other      = Nothing
580
581 encodeFS :: UserFS -> EncodedFS
582 encodeFS fast_str  | all unencodedChar str = fast_str
583                    | otherwise             = _PK_ (encode str)
584                    where
585                      str = _UNPK_ fast_str
586
587 unencodedChar :: Char -> Bool   -- True for chars that don't need encoding
588 unencodedChar '_' = True
589 unencodedChar 'Z' = False
590 unencodedChar 'z' = False
591 unencodedChar c   = ISALPHANUM c
592
593 encode_ch :: Char -> EncodedString
594 encode_ch c | unencodedChar c = [c]     -- Common case first
595
596 -- Constructors
597 encode_ch '('  = "ZL"   -- Needed for things like (,), and (->)
598 encode_ch ')'  = "ZR"   -- For symmetry with (
599 encode_ch '['  = "ZM"
600 encode_ch ']'  = "ZN"
601 encode_ch ':'  = "ZC"
602 encode_ch 'Z'  = "ZZ"
603
604 -- Variables
605 encode_ch 'z'  = "zz"
606 encode_ch '&'  = "za"
607 encode_ch '|'  = "zb"
608 encode_ch '$'  = "zd"
609 encode_ch '='  = "ze"
610 encode_ch '>'  = "zg"
611 encode_ch '#'  = "zh"
612 encode_ch '.'  = "zi"
613 encode_ch '<'  = "zl"
614 encode_ch '-'  = "zm"
615 encode_ch '!'  = "zn"
616 encode_ch '+'  = "zp"
617 encode_ch '\'' = "zq"
618 encode_ch '\\' = "zr"
619 encode_ch '/'  = "zs"
620 encode_ch '*'  = "zt"
621 encode_ch c    = ['z', 'x', intToDigit hi, intToDigit lo]
622                where
623                  (hi,lo) = ord c `quotRem` 16
624 \end{code}
625
626 Decode is used for user printing.
627
628 \begin{code}
629 decodeFS :: FAST_STRING -> FAST_STRING
630 decodeFS fs = _PK_ (decode (_UNPK_ fs))
631
632 decode :: EncodedString -> UserString
633 decode [] = []
634 decode ('Z' : rest) = decode_escape rest
635 decode ('z' : rest) = decode_escape rest
636 decode (c   : rest) = c : decode rest
637
638 decode_escape :: EncodedString -> UserString
639
640 decode_escape ('Z' : rest) = 'Z' : decode rest
641 decode_escape ('C' : rest) = ':' : decode rest
642 decode_escape ('L' : rest) = '(' : decode rest
643 decode_escape ('R' : rest) = ')' : decode rest
644 decode_escape ('M' : rest) = '[' : decode rest
645 decode_escape ('N' : rest) = ']' : decode rest
646
647 decode_escape ('z' : rest) = 'z' : decode rest
648 decode_escape ('a' : rest) = '&' : decode rest
649 decode_escape ('b' : rest) = '|' : decode rest
650 decode_escape ('d' : rest) = '$' : decode rest
651 decode_escape ('e' : rest) = '=' : decode rest
652 decode_escape ('g' : rest) = '>' : decode rest
653 decode_escape ('h' : rest) = '#' : decode rest
654 decode_escape ('i' : rest) = '.' : decode rest
655 decode_escape ('l' : rest) = '<' : decode rest
656 decode_escape ('m' : rest) = '-' : decode rest
657 decode_escape ('n' : rest) = '!' : decode rest
658 decode_escape ('p' : rest) = '+' : decode rest
659 decode_escape ('q' : rest) = '\'' : decode rest
660 decode_escape ('r' : rest) = '\\' : decode rest
661 decode_escape ('s' : rest) = '/' : decode rest
662 decode_escape ('t' : rest) = '*' : decode rest
663 decode_escape ('x' : d1 : d2 : rest) = chr (digitToInt d1 * 16 + digitToInt d2)  : decode rest
664
665 -- Tuples are coded as Z23T
666 decode_escape (c : rest)
667   | isDigit c = go (digitToInt c) rest
668   where
669     go n (c : rest) | isDigit c = go (10*n + digitToInt c) rest
670     go n ('T' : rest)           = '(' : replicate n ',' ++ ')' : decode rest
671     go n other = pprPanic "decode_escape" (ppr n <+> text (c:rest))
672
673 decode_escape (c : rest) = pprTrace "decode_escape" (char c) (decode rest)
674 \end{code}
675
676
677 %************************************************************************
678 %*                                                                      *
679 n\subsection{Lexical categories}
680 %*                                                                      *
681 %************************************************************************
682
683 These functions test strings to see if they fit the lexical categories
684 defined in the Haskell report.
685
686 \begin{code}
687 isLexCon,   isLexVar,    isLexId,    isLexSym    :: FAST_STRING -> Bool
688 isLexConId, isLexConSym, isLexVarId, isLexVarSym :: FAST_STRING -> Bool
689
690 isLexCon cs = isLexConId  cs || isLexConSym cs
691 isLexVar cs = isLexVarId  cs || isLexVarSym cs
692
693 isLexId  cs = isLexConId  cs || isLexVarId  cs
694 isLexSym cs = isLexConSym cs || isLexVarSym cs
695
696 -------------
697
698 isLexConId cs                           -- Prefix type or data constructors
699   | _NULL_ cs        = False            --      e.g. "Foo", "[]", "(,)" 
700   | cs == SLIT("[]") = True
701   | c  == '('        = True     -- (), (,), (,,), ...
702   | otherwise        = isUpper c || isUpperISO c
703   where                                 
704     c = _HEAD_ cs
705
706 isLexVarId cs                           -- Ordinary prefix identifiers
707   | _NULL_ cs    = False                --      e.g. "x", "_x"
708   | otherwise    = isLower c || isLowerISO c || c == '_'
709   where
710     c = _HEAD_ cs
711
712 isLexConSym cs                          -- Infix type or data constructors
713   | _NULL_ cs   = False                 --      e.g. ":-:", ":", "->"
714   | otherwise   = c  == ':'
715                || cs == SLIT("->")
716   where
717     c = _HEAD_ cs
718
719 isLexVarSym cs                          -- Infix identifiers
720   | _NULL_ cs = False                   --      e.g. "+"
721   | otherwise = isSymbolASCII c
722              || isSymbolISO c
723   where
724     c = _HEAD_ cs
725
726 -------------
727 isSymbolASCII c = c `elem` "!#$%&*+./<=>?@\\^|~-"
728 isSymbolISO   c = ord c `elem` (0xd7 : 0xf7 : [0xa1 .. 0xbf])
729 isUpperISO    (C# c#) = c# `geChar#` '\xc0'# && c# `leChar#` '\xde'# && c# `neChar#` '\xd7'#
730         --0xc0 <= oc && oc <= 0xde && oc /= 0xd7 where oc = ord c
731 isLowerISO    (C# c#) = c# `geChar#` '\xdf'# && c# `leChar#` '\xff'# && c# `neChar#` '\xf7'#
732         --0xdf <= oc && oc <= 0xff && oc /= 0xf7 where oc = ord c
733 \end{code}