merge r98600
[mono.git] / mcs / docs / compiler.txt
1                        The Internals of the Mono C# Compiler
2         
3                                 Miguel de Icaza
4                               (miguel@ximian.com)
5                                    2002, 2007
6
7 * Abstract
8
9         The Mono C# compiler is a C# compiler written in C# itself.
10         Its goals are to provide a free and alternate implementation
11         of the C# language.  The Mono C# compiler generates ECMA CIL
12         images through the use of the System.Reflection.Emit API which
13         enable the compiler to be platform independent.
14         
15 * Overview: How the compiler fits together
16
17         The compilation process is managed by the compiler driver (it
18         lives in driver.cs).
19
20         The compiler reads a set of C# source code files, and parses
21         them.  Any assemblies or modules that the user might want to
22         use with his project are loaded after parsing is done.
23
24         Once all the files have been parsed, the type hierarchy is
25         resolved.  First interfaces are resolved, then types and
26         enumerations.
27
28         Once the type hierarchy is resolved, every type is populated:
29         fields, methods, indexers, properties, events and delegates
30         are entered into the type system.  
31
32         At this point the program skeleton has been completed.  The
33         next process is to actually emit the code for each of the
34         executable methods.  The compiler drives this from
35         RootContext.EmitCode.
36
37         Each type then has to populate its methods: populating a
38         method requires creating a structure that is used as the state
39         of the block being emitted (this is the EmitContext class) and
40         then generating code for the topmost statement (the Block).
41
42         Code generation has two steps: the first step is the semantic
43         analysis (Resolve method) that resolves any pending tasks, and
44         guarantees that the code is correct.  The second phase is the
45         actual code emission.  All errors are flagged during in the
46         "Resolution" process. 
47
48         After all code has been emitted, then the compiler closes all
49         the types (this basically tells the Reflection.Emit library to
50         finish up the types), resources, and definition of the entry
51         point are done at this point, and the output is saved to
52         disk. 
53
54         The following list will give you an idea of where the
55         different pieces of the compiler live:
56
57         Infrastructure:
58
59             driver.cs:
60                 This drives the compilation process: loading of
61                 command line options; parsing the inputs files;
62                 loading the referenced assemblies; resolving the type
63                 hierarchy and emitting the code. 
64
65             codegen.cs:
66                 
67                 The state tracking for code generation. 
68
69             attribute.cs:
70
71                 Code to do semantic analysis and emit the attributes
72                 is here.
73
74             rootcontext.cs:
75
76                 Keeps track of the types defined in the source code,
77                 as well as the assemblies loaded.  
78
79             typemanager.cs:
80
81                 This contains the MCS type system.
82
83             report.cs:
84
85                 Error and warning reporting methods.
86
87             support.cs:
88
89                 Assorted utility functions used by the compiler.
90                 
91         Parsing
92
93             cs-tokenizer.cs:
94
95                 The tokenizer for the C# language, it includes also
96                 the C# pre-processor.
97
98             cs-parser.jay, cs-parser.cs:
99
100                 The parser is implemented using a C# port of the Yacc
101                 parser.  The parser lives in the cs-parser.jay file,
102                 and cs-parser.cs is the generated parser.
103
104             location.cs:
105
106                 The `location' structure is a compact representation
107                 of a file, line, column where a token, or a high-level
108                 construct appears.  This is used to report errors.
109
110         Expressions:
111           
112             ecore.cs
113         
114                 Basic expression classes, and interfaces most shared
115                 code and static methods are here.
116
117             expression.cs:
118
119                 Most of the different kinds of expressions classes
120                 live in this file.
121
122             assign.cs:
123
124                 The assignment expression got its own file.
125
126             constant.cs:
127
128                 The classes that represent the constant expressions.
129
130             literal.cs
131                 
132                 Literals are constants that have been entered manually
133                 in the source code, like `1' or `true'.  The compiler
134                 needs to tell constants from literals apart during the
135                 compilation process, as literals sometimes have some
136                 implicit extra conversions defined for them. 
137
138             cfold.cs:
139
140                 The constant folder for binary expressions.
141
142         Statements
143
144             statement.cs:
145
146                 All of the abstract syntax tree elements for
147                 statements live in this file.  This also drives the
148                 semantic analysis process.
149
150             iterators.cs:
151
152                 Contains the support for implementing iterators from
153                 the C# 2.0 specification.
154
155         Declarations, Classes, Structs, Enumerations
156
157             decl.cs
158
159                 This contains the base class for Members and
160                 Declaration Spaces.   A declaration space introduces
161                 new names in types, so classes, structs, delegates and
162                 enumerations derive from it.
163
164             class.cs:
165                 
166                 Methods for holding and defining class and struct
167                 information, and every member that can be in these
168                 (methods, fields, delegates, events, etc).
169
170                 The most interesting type here is the `TypeContainer'
171                 which is a derivative of the `DeclSpace' 
172
173             delegate.cs:
174
175                 Handles delegate definition and use. 
176
177             enum.cs:
178
179                 Handles enumerations.
180
181             interface.cs:
182
183                 Holds and defines interfaces.  All the code related to
184                 interface declaration lives here.
185
186             parameter.cs:
187
188                 During the parsing process, the compiler encapsulates
189                 parameters in the Parameter and Parameters classes.
190                 These classes provide definition and resolution tools
191                 for them.
192
193             pending.cs:
194
195                 Routines to track pending implementations of abstract
196                 methods and interfaces.  These are used by the
197                 TypeContainer-derived classes to track whether every
198                 method required is implemented.
199
200         
201 * The parsing process
202
203         All the input files that make up a program need to be read in
204         advance, because C# allows declarations to happen after an
205         entity is used, for example, the following is a valid program:
206
207         class X : Y {
208                 static void Main ()
209                 {
210                         a = "hello"; b = "world";
211                 }
212                 string a;
213         }
214         
215         class Y {
216                 public string b;
217         }
218
219         At the time the assignment expression `a = "hello"' is parsed,
220         it is not know whether a is a class field from this class, or
221         its parents, or whether it is a property access or a variable
222         reference.  The actual meaning of `a' will not be discovered
223         until the semantic analysis phase.
224
225 ** The Tokenizer and the pre-processor
226
227         The tokenizer is contained in the file `cs-tokenizer.cs', and
228         the main entry point is the `token ()' method.  The tokenizer
229         implements the `yyParser.yyInput' interface, which is what the
230         Yacc/Jay parser will use when fetching tokens.  
231
232         Token definitions are generated by jay during the compilation
233         process, and those can be references from the tokenizer class
234         with the `Token.' prefix. 
235
236         Each time a token is returned, the location for the token is
237         recorded into the `Location' property, that can be accessed by
238         the parser.  The parser retrieves the Location properties as
239         it builds its internal representation to allow the semantic
240         analysis phase to produce error messages that can pin point
241         the location of the problem. 
242
243         Some tokens have values associated with it, for example when
244         the tokenizer encounters a string, it will return a
245         LITERAL_STRING token, and the actual string parsed will be
246         available in the `Value' property of the tokenizer.   The same
247         mechanism is used to return integers and floating point
248         numbers. 
249
250         C# has a limited pre-processor that allows conditional
251         compilation, but it is not as fully featured as the C
252         pre-processor, and most notably, macros are missing.  This
253         makes it simple to implement in very few lines and mesh it
254         with the tokenizer.
255
256         The `handle_preprocessing_directive' method in the tokenizer
257         handles all the pre-processing, and it is invoked when the '#'
258         symbol is found as the first token in a line.  
259
260         The state of the pre-processor is contained in a Stack called
261         `ifstack', this state is used to track the if/elif/else/endif
262         nesting and the current state.  The state is encoded in the
263         top of the stack as a number of values `TAKING',
264         `TAKEN_BEFORE', `ELSE_SEEN', `PARENT_TAKING'.
265
266 ** Locations
267
268         Locations are encoded as a 32-bit number (the Location
269         struct) that map each input source line to a linear number.
270         As new files are parsed, the Location manager is informed of
271         the new file, to allow it to map back from an int constant to
272         a file + line number.
273
274         Prior to parsing/tokenizing any source files, the compiler
275         generates a list of all the source files and then reserves the
276         low N bits of the location to hold the source file, where N is
277         large enough to hold at least twice as many source files as were
278         specified on the command line (to allow for a #line in each file).
279         The upper 32-N bits are the line number in that file.
280
281         The token 0 is reserved for ``anonymous'' locations, ie. if we
282         don't know the location (Location.Null).
283
284         The tokenizer also tracks the column number for a token, but
285         this is currently not being used or encoded.  It could
286         probably be encoded in the low 9 bits, allowing for columns
287         from 1 to 512 to be encoded.
288
289 * The Parser
290
291         The parser is written using Jay, which is a port of Berkeley
292         Yacc to Java, that I later ported to C#. 
293
294         Many people ask why the grammar of the parser does not match
295         exactly the definition in the C# specification.  The reason is
296         simple: the grammar in the C# specification is designed to be
297         consumed by humans, and not by a computer program.  Before
298         you can feed this grammar to a tool, it needs to be simplified
299         to allow the tool to generate a correct parser for it. 
300
301         In the Mono C# compiler, we use a class for each of the
302         statements and expressions in the C# language.  For example,
303         there is a `While' class for the the `while' statement, a
304         `Cast' class to represent a cast expression and so on.
305
306         There is a Statement class, and an Expression class which are
307         the base classes for statements and expressions. 
308
309 ** Namespaces
310         
311         Using list.
312
313 * Internal Representation
314
315 ** Expressions
316
317         Expressions in the Mono C# compiler are represented by the
318         `Expression' class.  This is an abstract class that particular
319         kinds of expressions have to inherit from and override a few
320         methods.
321
322         The base Expression class contains two fields: `eclass' which
323         represents the "expression classification" (from the C#
324         specs) and the type of the expression.
325
326         During parsing, the compiler will create the various trees of
327         expressions.  These expressions have to be resolved before they
328         are can be used.    The semantic analysis is implemented by
329         resolving each of the expressions created during parsing and
330         creating fully resolved expressions.
331
332         A common pattern that you will notice in the compiler is this:
333
334                   Expression expr;
335                   ...
336         
337                   expr = expr.Resolve (ec);
338                   if (expr == null)
339                         // There was an error, stop processing by returning
340
341         The resolution process is implemented by overriding the
342         `DoResolve' method.  The DoResolve method has to set the `eclass'
343         field and the `type', perform all error checking and computations
344         that will be required for code generation at this stage.
345
346         The return value from DoResolve is an expression.  Most of the
347         time an Expression derived class will return itself (return
348         this) when it will handle the emission of the code itself, or
349         it can return a new Expression.
350
351         For example, the parser will create an "ElementAccess" class
352         for:
353
354                 a [0] = 1;
355
356         During the resolution process, the compiler will know whether
357         this is an array access, or an indexer access.  And will
358         return either an ArrayAccess expression or an IndexerAccess
359         expression from DoResolve.
360
361         All errors must be reported during the resolution phase
362         (DoResolve) and if an error is detected the DoResolve method
363         will return null which is used to flag that an error condition
364         has occurred, this will be used to stop compilation later on.
365         This means that anyone that calls Expression.Resolve must
366         check the return value for null which would indicate an error
367         condition.
368
369         The second stage that Expressions participate in is code
370         generation, this is done by overwriting the "Emit" method of
371         the Expression class.  No error checking must be performed
372         during this stage.
373
374         We take advantage of the distinction between the expressions that
375         are generated by the parser and the expressions that are the
376         result of the semantic analysis phase for lambda expressions (more
377         information in the "Lambda Expressions" section).
378
379         But what is important is that expressions and statements that are
380         generated by the parser should implement the cloning
381         functionality.  This is used lambda expressions require the
382         compiler to attempt to resolve a given block of code with
383         different possible types for parameters that have their types
384         implicitly inferred. 
385
386 ** Simple Names, MemberAccess
387
388         One of the most important classes in the compiler is
389         "SimpleName" which represents a simple name (from the C#
390         specification).  The names during the resolution time are
391         bound to field names, parameter names or local variable names.
392
393         More complicated expressions like:
394
395                 Math.Sin
396
397         Are composed using the MemberAccess class which contains a
398         name (Math) and a SimpleName (Sin), this helps driving the
399         resolution process.
400
401 ** Types
402
403         The parser creates expressions to represent types during
404         compilation.  For example:
405
406            class Sample {
407
408                 Version vers;
409
410            }
411
412
413         That will produce a "SimpleName" expression for the "Version"
414         word.  And in this particular case, the parser will introduce
415         "Version vers" as a field declaration.
416
417         During the resolution process for the fields, the compiler
418         will have to resolve the word "Version" to a type.  This is
419         done by using the "ResolveAsType" method in Expression instead
420         of using "Resolve".
421
422         ResolveAsType just turns on a different set of code paths for
423         things like SimpleNames and does a different kind of error
424         checking than the one used by regular expressions. 
425
426 ** Constants
427
428         Constants in the Mono C# compiler are represented by the
429         abstract class `Constant'.  Constant is in turn derived from
430         Expression.  The base constructor for `Constant' just sets the
431         expression class to be an `ExprClass.Value', Constants are
432         born in a fully resolved state, so the `DoResolve' method
433         only returns a reference to itself.
434
435         Each Constant should implement the `GetValue' method which
436         returns an object with the actual contents of this constant, a
437         utility virtual method called `AsString' is used to render a
438         diagnostic message.  The output of AsString is shown to the
439         developer when an error or a warning is triggered.
440
441         Constant classes also participate in the constant folding
442         process.  Constant folding is invoked by those expressions
443         that can be constant folded invoking the functionality
444         provided by the ConstantFold class (cfold.cs).   
445
446         Each Constant has to implement a number of methods to convert
447         itself into a Constant of a different type.  These methods are
448         called `ConvertToXXXX' and they are invoked by the wrapper
449         functions `ToXXXX'.  These methods only perform implicit
450         numeric conversions.  Explicit conversions are handled by the
451         `Cast' expression class.
452
453         The `ToXXXX' methods are the entry point, and provide error
454         reporting in case a conversion can not be performed.
455
456 ** Constant Folding
457
458         The C# language requires constant folding to be implemented.
459         Constant folding is hooked up in the Binary.Resolve method.
460         If both sides of a binary expression are constants, then the
461         ConstantFold.BinaryFold routine is invoked.  
462
463         This routine implements all the binary operator rules, it
464         is a mirror of the code that generates code for binary
465         operators, but that has to be evaluated at runtime.
466
467         If the constants can be folded, then a new constant expression
468         is returned, if not, then the null value is returned (for
469         example, the concatenation of a string constant and a numeric
470         constant is deferred to the runtime). 
471
472 ** Side effects
473
474         a [i++]++ 
475         a [i++] += 5;
476
477 ** Statements
478
479 *** Invariant meaning in a block
480
481         The seemingly small section in the standard entitled
482         "invariant meaning in a block" has several subtleties
483         involved, especially when we try to implement the semantics
484         efficiently.
485
486         Most of the semantics are trivial, and basically prevent local
487         variables from shadowing parameters and other local variables.
488         However, this notion is not limited to that, but affects all
489         simple name accesses within a block.  And therein lies the rub
490         -- instead of just worrying about the issue when we arrive at
491         variable declarations, we need to verify this property at
492         every use of a simple name within a block.
493
494         The key notion that helps us is to note the bi-directional
495         action of a variable declaration.  The declaration together
496         with anti-shadowing rules can maintain the IMiaB property for
497         the block containing the declaration and all nested sub
498         blocks.  But, the IMiaB property also forces all surrounding
499         blocks to avoid using the name.  We thus need to maintain a
500         blacklist of taboo names in all surrounding blocks -- and we
501         take the expedient of doing so simply: actually maintaining a
502         (superset of the) blacklist in each block data structure, which
503         we call the 'known_variable' list.
504
505         Because we create the 'known_variable' list during the parse
506         process, by the time we do simple name resolution, all the
507         blacklists are fully populated.  So, we can just enforce the
508         rest of the IMiaB property by looking up a couple of lists.
509
510         This turns out to be quite efficient: when we used a block
511         tree walk, a test case took 5-10mins, while with this simple
512         mildly-redundant data structure, the time taken for the same
513         test case came down to a couple of seconds.
514
515         The IKnownVariable interface is a small wrinkle.  Firstly, the
516         IMiaB also applies to parameter names, especially those of
517         anonymous methods.  Secondly, we need more information than
518         just the name in the blacklist -- we need the location of the
519         name and where it's declared.  We use the IKnownVariable
520         interface to abstract out the parser information stored for
521         local variables and parameters.
522
523 * The semantic analysis 
524
525         Hence, the compiler driver has to parse all the input files.
526         Once all the input files have been parsed, and an internal
527         representation of the input program exists, the following
528         steps are taken:
529
530                 * The interface hierarchy is resolved first.
531                   As the interface hierarchy is constructed,
532                   TypeBuilder objects are created for each one of
533                   them. 
534
535                 * Classes and structure hierarchy is resolved next,
536                   TypeBuilder objects are created for them.
537
538                 * Constants and enumerations are resolved.
539
540                 * Method, indexer, properties, delegates and event
541                   definitions are now entered into the TypeBuilders. 
542
543                 * Elements that contain code are now invoked to
544                   perform semantic analysis and code generation.
545
546 * Output Generation
547
548 ** Code Generation
549
550         The EmitContext class is created any time that IL code is to
551         be generated (methods, properties, indexers and attributes all
552         create EmitContexts).  
553
554         The EmitContext keeps track of the current namespace and type
555         container.  This is used during name resolution.
556
557         An EmitContext is used by the underlying code generation
558         facilities to track the state of code generation:
559
560                 * The ILGenerator used to generate code for this
561                   method.
562
563                 * The TypeContainer where the code lives, this is used
564                   to access the TypeBuilder.
565
566                 * The DeclSpace, this is used to resolve names through
567                   RootContext.LookupType in the various statements and
568                   expressions. 
569         
570         Code generation state is also tracked here:
571
572                 * CheckState:
573
574                   This variable tracks the `checked' state of the
575                   compilation, it controls whether we should generate
576                   code that does overflow checking, or if we generate
577                   code that ignores overflows.
578                   
579                   The default setting comes from the command line
580                   option to generate checked or unchecked code plus
581                   any source code changes using the checked/unchecked
582                   statements or expressions.  Contrast this with the
583                   ConstantCheckState flag.
584
585                 * ConstantCheckState
586                   
587                   The constant check state is always set to `true' and
588                   cant be changed from the command line.  The source
589                   code can change this setting with the `checked' and
590                   `unchecked' statements and expressions.
591                   
592                 * IsStatic
593                   
594                   Whether we are emitting code inside a static or
595                   instance method
596                   
597                 * ReturnType
598                   
599                   The value that is allowed to be returned or NULL if
600                   there is no return type.
601                   
602                 * ReturnLabel 
603
604                   A `Label' used by the code if it must jump to it.
605                   This is used by a few routines that deals with exception
606                   handling.
607
608                 * HasReturnLabel
609
610                   Whether we have a return label defined by the toplevel
611                   driver.
612                   
613                 * ContainerType
614                   
615                   Points to the Type (extracted from the
616                   TypeContainer) that declares this body of code
617                   summary>
618                   
619                   
620                 * IsConstructor
621                   
622                   Whether this is generating code for a constructor
623
624                 * CurrentBlock
625
626                   Tracks the current block being generated.
627
628                 * ReturnLabel;
629                 
630                   The location where return has to jump to return the
631                   value
632
633         A few variables are used to track the state for checking in
634         for loops, or in try/catch statements:
635
636                 * InFinally
637                 
638                   Whether we are in a Finally block
639
640                 * InTry
641
642                   Whether we are in a Try block
643
644                 * InCatch
645                   
646                   Whether we are in a Catch block
647
648                 * InUnsafe
649                   Whether we are inside an unsafe block
650
651         Methods exposed by the EmitContext:
652
653                 * EmitTopBlock()
654
655                   This emits a toplevel block. 
656
657                   This routine is very simple, to allow the anonymous
658                   method support to roll its two-stage version of this
659                   routine on its own.
660
661                 * NeedReturnLabel ():
662
663                   This is used to flag during the resolution phase that 
664                   the driver needs to initialize the `ReturnLabel'
665
666 * Anonymous Methods
667
668         The introduction of anonymous methods in the compiler changed
669         various ways of doing things in the compiler.  The most
670         significant one is the hard split between the resolution phase
671         and the emission phases of the compiler.
672
673         For instance, routines that referenced local variables no
674         longer can safely create temporary variables during the
675         resolution phase: they must do so from the emission phase,
676         since the variable might have been "captured", hence access to
677         it can not be done with the local-variable operations from the
678         runtime.
679
680         The code emission is in:
681
682                 EmitTopBlock ()
683
684         Which drives the process, it first resolves the topblock, then
685         emits the required metadata (local variable definitions) and
686         finally emits the code.
687
688         A detailed description of anonymous methods and iterators is
689         on the new-anonymous-design.txt file in this directory.
690
691 * Lambda Expressions
692
693         Lambda expressions can come in two forms: those that have implicit
694         parameter types and those that have explicit parameter types, for
695         example:
696
697                 Explicit:       
698
699                         Foo ((int x) => x + 1);
700
701                 Implicit:
702
703                         Foo (x => x + 1)
704
705
706         One of the problems that we faced with lambda expressions is
707         that lambda expressions need to be "probed" with different
708         types until a working combination is found.
709
710         For example:
711
712             x => x.i
713
714         The above expression could mean vastly different things depending
715         on the type of "x".  The compiler determines the type of "x" (left
716         hand side "x") at the moment the above expression is "bound",
717         which means that during the compilation process it will try to
718         match the above lambda with all the possible types available, for
719         example:
720
721         delegate int di (int x);
722         delegate string ds (string s);
723         ..
724         Foo (di x) {}
725         Foo (ds x) {}
726         ...
727         Foo (x => "string")
728
729         In the above example, overload resolution will try "x" as an "int"
730         and will try "x" as a string.  And if one of them "compiles" thats
731         the one it picks (and it also copes with ambiguities if there was
732         more than one matching method).
733
734         To compile this, we need to hook into the resolution process,
735         but since the resolution process has side effects (calling
736         Resolve can either return instances of the resolved expression
737         type, or can alter field internals) it was necessary to
738         incorporate a framework to "clone" expressions before we
739         probe.
740
741         The support for cloning was added into Statements and
742         Expressions and is only necessary for objects of those types
743         that are created during parsing.   It is not necessary to
744         support these in the classes that are the result of calling
745         Resolve.   This means that SimpleName needs support for
746         Cloning, but FieldExpr does not need it (SimpleName is created
747         by the parser, FieldExpr is created during semantic analysis
748         resolution).   
749
750         The work happens through the public method called "Clone" that
751         clones the given Statement or Expression.  The base method in
752         Statement and Expression merely does a MemberwiseCopy of the
753         elements and then calls the virtual CloneTo method to complete
754         the copy.    By default this method throws an exception, this
755         is useful to catch cases where we forgot to override CloneTo
756         for a given Statement/Expression. 
757
758         With the cloning capability it became possible to call resolve
759         multiple times (once for each Cloned copy) and based on this
760         picking the one implementation that would compile and that
761         would not be ambiguous.
762
763         The cloning process is basically a deep copy that happens in the
764         LambdaExpression class and it clones the top-level block for the
765         lambda expression.    The cloning has the side effect of cloning
766         the entire containing block as well. 
767
768         This happens inside this method:
769
770         public override bool ImplicitStandardConversionExists (Type delegate_type)
771
772         This is used to determine if the current Lambda expression can be
773         implicitly converted to the given delegate type.
774
775         And also happens as a result of the generic method parameter
776         type inferencing. 
777
778 ** Lambda Expressions and Cloning
779
780         All statements that are created during the parsing method should
781         implement the CloneTo method:
782
783                 protected virtual void CloneTo (CloneContext clonectx, Statement target)
784
785         This method is called by the Statement.Clone method after it has
786         done a shallow-copy of all the fields in the statement, and they
787         should typically Clone any child statements.
788
789         Expressions should implement the CloneTo method as well:
790
791                 protected virtual void CloneTo (CloneContext clonectx, Expression target)
792
793 ** Lambda Expressions and Contextual Return
794
795         When an expression is parsed as a lambda expression, the parser
796         inserts a call to a special statement, the contextual return.
797
798         The expression:
799
800             a => a+1
801
802         Is actually compiled as:
803
804             a => contextual_return (a+1)
805
806         The contextual_return statement will behave differently depending
807         on the return type of the delegate that the expression will be
808         converted to.
809
810         If the delegate return type is void, the above will basically turn
811         into an empty operation.   Otherwise the above will become
812         a return statement that can infer return types.
813
814 * Miscellaneous
815
816 ** Error Processing.
817
818         Errors are reported during the various stages of the
819         compilation process.  The compiler stops its processing if
820         there are errors between the various phases.  This simplifies
821         the code, because it is safe to assume always that the data
822         structures that the compiler is operating on are always
823         consistent.
824
825         The error codes in the Mono C# compiler are the same as those
826         found in the Microsoft C# compiler, with a few exceptions
827         (where we report a few more errors, those are documented in
828         mcs/errors/errors.txt).  The goal is to reduce confusion to
829         the users, and also to help us track the progress of the
830         compiler in terms of the errors we report. 
831
832         The Report class provides error and warning display functions,
833         and also keeps an error count which is used to stop the
834         compiler between the phases.  
835
836         A couple of debugging tools are available here, and are useful
837         when extending or fixing bugs in the compiler.  If the
838         `--fatal' flag is passed to the compiler, the Report.Error
839         routine will throw an exception.  This can be used to pinpoint
840         the location of the bug and examine the variables around the
841         error location.
842
843         Warnings can be turned into errors by using the `--werror'
844         flag to the compiler. 
845
846         The report class also ignores warnings that have been
847         specified on the command line with the `--nowarn' flag.
848
849         Finally, code in the compiler uses the global variable
850         RootContext.WarningLevel in a few places to decide whether a
851         warning is worth reporting to the user or not.  
852
853 * Debugging the compiler
854
855         Sometimes it is convenient to find *how* a particular error
856         message is being reported from, to do that, you might want to use
857         the --fatal flag to mcs.  The flag will instruct the compiler to 
858         abort with a stack trace execution when the error is reported.
859
860         You can use this with -warnaserror to obtain the same effect
861         with warnings. 
862
863 * Debugging the Parser.
864
865         A useful trick while debugging the parser is to pass the -v
866         command line option to the compiler.
867
868         The -v command line option will dump the various Yacc states
869         as well as the tokens that are being returned from the
870         tokenizer to the compiler.
871
872         This is useful when tracking down problems when the compiler
873         is not able to parse an expression correctly.
874
875         You can match the states reported with the contents of the
876         y.output file, a file that contains the parsing tables and
877         human-readable information about the generated parser.
878
879 * Editing the compiler sources
880
881         The compiler sources are intended to be edited with 134 columns of width
882
883 * Quick Hacks
884
885         Once you have a full build of mcs, you can improve your
886         development time by just issuing make in the `mcs' directory or
887         using `make qh' in the gmcs directory.