You are viewing a plain text version of this content. The canonical link for it is here.
Posted to alexandria-dev@jakarta.apache.org by jm...@apache.org on 2001/04/18 17:45:13 UTC

cvs commit: jakarta-alexandria/proposal/jxr2/tests control1.txt control2.txt control3.txt control4.txt control5.txt test1.txt test2.txt test3.txt test4.txt test5.txt

jmartin     01/04/18 08:45:13

  Added:       proposal/jxr2 build.xml
               proposal/jxr2/lib antlr.jar antlrall.jar jdom-b6.jar
                        xmlunit.jar
               proposal/jxr2/src/css syntax.css
               proposal/jxr2/src/grammer java.g
               proposal/jxr2/src/java/org/apache/alexandria/jxr
                        JavaSAXLiaison.java JavaSAXParser.java Jxr.java
                        test_JavaSAXLiaison.java test_JavaSAXParser.java
               proposal/jxr2/src/xsl test.xsl
               proposal/jxr2/tests control1.txt control2.txt control3.txt
                        control4.txt control5.txt test1.txt test2.txt
                        test3.txt test4.txt test5.txt
  Log:
  Initial checkin in of jxr2
  
  Revision  Changes    Path
  1.1                  jakarta-alexandria/proposal/jxr2/build.xml
  
  Index: build.xml
  ===================================================================
  <project default="main">
      <property name="src.dir" value="src/java" />
      <property name="build.dir" value="build/jxr" />
      <property name="project" value="Alexandria"/>
      <property name="build.classes" value="classes" />
  
      <target name="prepare">
          <mkdir dir="${build.dir}" />
          <mkdir dir="${build.classes}" />
          <mkdir dir="tmp" />
      </target>
  
      <target name="clean" description="Clear compiled classes">
          <delete dir="${build.classes}" />
          <delete dir="tmp" />
      </target>
  
      <target name="make-parser">
        <antlr
         target="src/grammer/java.g"
         outputdirectory="${src.dir}/org/apache/alexandria/jxr"/>
      </target>
  
      <target name="main" depends="prepare,make-parser" description="Build JXR">
          <javac
              srcdir="${src.dir}"
              destdir="${build.classes}"
              debug="true" >
            <classpath>
              <fileset dir="../../lib">
                <include name="*.jar"/>
              </fileset>
              <fileset dir="lib">
                <include name="*.jar"/>
              </fileset>
            </classpath>
          </javac>
      </target>
  
      <target name="test" depends="main">
        <junit>
          <formatter type="plain" usefile="false"/>
          <classpath>
            <pathelement path="classes"/>
          </classpath>
          <batchtest>
            <fileset dir="${src.dir}">
              <include name="**/test_*.java"/>
            </fileset>
          </batchtest>
        </junit>
        <style in="tmp/test.xml" style="src/xsl/test.xsl" out="test.html"/>
      </target>
  
      <target name="jxr">
        <taskdef name="jxr" classname="org.apache.alexandria.jxr.Jxr" classpath="classes"/>
        <jxr style="src/xsl/test.xsl" outdir="output">
          <fileset dir="src/java">
            <include name="**/*.java"/>
          </fileset>
        </jxr>
      </target>
  </project>
  
  
  
  1.1                  jakarta-alexandria/proposal/jxr2/lib/antlr.jar
  
  	<<Binary file>>
  
  
  1.1                  jakarta-alexandria/proposal/jxr2/lib/antlrall.jar
  
  	<<Binary file>>
  
  
  1.1                  jakarta-alexandria/proposal/jxr2/lib/jdom-b6.jar
  
  	<<Binary file>>
  
  
  1.1                  jakarta-alexandria/proposal/jxr2/lib/xmlunit.jar
  
  	<<Binary file>>
  
  
  1.1                  jakarta-alexandria/proposal/jxr2/src/css/syntax.css
  
  Index: syntax.css
  ===================================================================
  .key{
  	color: blue;
  }
  .null{
  	color: red;
  }
  .cmd{
  	color: green;
  }
  .text{
  	color: purple;
  }
  body{
  	background: white;
  }
  
  
  
  
  1.1                  jakarta-alexandria/proposal/jxr2/src/grammer/java.g
  
  Index: java.g
  ===================================================================
  header {
  package org.apache.alexandria.jxr;
  }
  
  /**
   * Java 1.2 Recognizer
   */
  
  class JavaRecognizer extends Parser;
  options {
  	k = 2;                           // two token lookahead
  	exportVocab=Java;                // Call its vocabulary "Java"
  	codeGenMakeSwitchThreshold = 2;  // Some optimizations
  	codeGenBitsetTestThreshold = 3;
  	defaultErrorHandler = false;     // Don't generate parser error handlers
  	buildAST = true;
  }
  
  tokens {
  	BLOCK; MODIFIERS; OBJBLOCK; SLIST; CTOR_DEF; METHOD_DEF; VARIABLE_DEF; 
  	INSTANCE_INIT; STATIC_INIT; TYPE; CLASS_DEF; INTERFACE_DEF; 
  	PACKAGE_DEF; ARRAY_DECLARATOR; EXTENDS_CLAUSE; IMPLEMENTS_CLAUSE;
  	PARAMETERS; PARAMETER_DEF; LABELED_STAT; TYPECAST; INDEX_OP; 
  	POST_INC; POST_DEC; METHOD_CALL; EXPR; ARRAY_INIT; 
  	IMPORT; UNARY_MINUS; UNARY_PLUS; CASE_GROUP; ELIST; FOR_INIT; FOR_CONDITION; 
  	FOR_ITERATOR; EMPTY_STAT; FINAL="final"; ABSTRACT="abstract";
  }
  	
  // Compilation Unit: In Java, this is a single file.  This is the start
  //   rule for this parser
  compilationUnit
  	:	// A compilation unit starts with an optional package definition
  		(	packageDefinition
  		|	/* nothing */
  		)
  
  		// Next we have a series of zero or more import statements
  		( importDefinition )*
  
  		// Wrapping things up with any number of class or interface
  		//    definitions
  		( typeDefinition )*
  
  		EOF!
  	;
  
  
  // Package statement: "package" followed by an identifier.
  packageDefinition
  	options {defaultErrorHandler = true;} // let ANTLR handle errors
  	//:	p:"package"^ WS {#p.setType(PACKAGE_DEF);} identifier WS? SEMI!
  	:	p:"package"^ {#p.setType(PACKAGE_DEF);} identifier SEMI!
  	;
  
  
  // Import statement: import followed by a package or class name
  importDefinition
  	options {defaultErrorHandler = true;}
  	:	i:"import"^ {#i.setType(IMPORT);} identifierStar SEMI!
  	;
  
  // A type definition in a file is either a class or interface definition.
  typeDefinition
  	options {defaultErrorHandler = true;}
  	:	m:modifiers!
  		( classDefinition[#m]
  		| interfaceDefinition[#m]
  		)
  	|	SEMI!
  	;
  
  /** A declaration is the creation of a reference or primitive-type variable
   *  Create a separate Type/Var tree for each var in the var list.
   */
  declaration!
  	:	m:modifiers t:typeSpec[false] v:variableDefinitions[#m,#t]
  		{#declaration = #v;}
  	;
  
  // A list of zero or more modifiers.  We could have used (modifier)* in
  //   place of a call to modifiers, but I thought it was a good idea to keep
  //   this rule separate so they can easily be collected in a Vector if
  //   someone so desires
  modifiers
  	:	( modifier )*
  		{#modifiers = #([MODIFIERS, "MODIFIERS"], #modifiers);}
  	;
  
  
  // A type specification is a type name with possible brackets afterwards
  //   (which would make it an array type).
  typeSpec[boolean addImagNode]
  	: classTypeSpec[addImagNode]
  	| builtInTypeSpec[addImagNode]
  	;
  
  // A class type specification is a class type with possible brackets afterwards
  //   (which would make it an array type).
  classTypeSpec[boolean addImagNode]
  	:	identifier (lb:LBRACK^ {#lb.setType(ARRAY_DECLARATOR);} RBRACK!)*
  		{
  			if ( addImagNode ) {
  				#classTypeSpec = #(#[TYPE,"TYPE"], #classTypeSpec);
  			}
  		}
  	;
  
  // A builtin type specification is a builtin type with possible brackets
  // afterwards (which would make it an array type).
  builtInTypeSpec[boolean addImagNode]
  	:	builtInType (lb:LBRACK^ {#lb.setType(ARRAY_DECLARATOR);} RBRACK!)*
  		{
  			if ( addImagNode ) {
  				#builtInTypeSpec = #(#[TYPE,"TYPE"], #builtInTypeSpec);
  			}
  		}
  	;
  
  // A type name. which is either a (possibly qualified) class name or
  //   a primitive (builtin) type
  type
  	:	identifier
  	|	builtInType
  	;
  
  // The primitive types.
  builtInType
  	:	"void"
  	|	"boolean"
  	|	"byte"
  	|	"char"
  	|	"short"
  	|	"int"
  	|	"float"
  	|	"long"
  	|	"double"
  	;
  
  // A (possibly-qualified) java identifier.  We start with the first IDENT
  //   and expand its name by adding dots and following IDENTS
  identifier
  	:	IDENT  ( DOT IDENT )*
  	;
  
  identifierStar
  	:	IDENT
  		( DOT IDENT )*
  		( DOT STAR  )?
  	;
  
  
  // modifiers for Java classes, interfaces, class/instance vars and methods
  modifier
  	:	"private"
  	|	"public"
  	|	"protected"
  	|	"static"
  	|	"transient"
  	|	"final"
  	|	"abstract"
  	|	"native"
  	|	"threadsafe"
  	|	"synchronized"
  //	|	"const"			// reserved word; leave out
  	|	"volatile"
  	;
  
  
  // Definition of a Java class
  classDefinition![AST modifiers]
  	:	"class" IDENT
  		// it _might_ have a superclass...
  		sc:superClassClause
  		// it might implement some interfaces...
  		ic:implementsClause
  		// now parse the body of the class
  		cb:classBlock
  		{#classDefinition = #(#[CLASS_DEF,"CLASS_DEF"],
  							   modifiers,IDENT,sc,ic,cb);}
  	;
  
  superClassClause!
  	:	( "extends" id:identifier )?
  		{#superClassClause = #(#[EXTENDS_CLAUSE,"EXTENDS_CLAUSE"],id);}
  	;
  
  // Definition of a Java Interface
  interfaceDefinition![AST modifiers]
  	:	"interface" IDENT
  		// it might extend some other interfaces
  		ie:interfaceExtends
  		// now parse the body of the interface (looks like a class...)
  		cb:classBlock
  		{#interfaceDefinition = #(#[INTERFACE_DEF,"INTERFACE_DEF"],
  									modifiers,IDENT,ie,cb);}
  	;
  
  
  // This is the body of a class.  You can have fields and extra semicolons,
  // That's about it (until you see what a field is...)
  classBlock
  	:	LCURLY!
  			( field | SEMI! )*
  		RCURLY!
  		{#classBlock = #([OBJBLOCK, "OBJBLOCK"], #classBlock);}
  	;
  
  // An interface can extend several other interfaces...
  interfaceExtends
  	:	(
  		e:"extends"!
  		identifier ( COMMA! identifier )*
  		)?
  		{#interfaceExtends = #(#[EXTENDS_CLAUSE,"EXTENDS_CLAUSE"],
  							#interfaceExtends);}
  	;
  
  // A class can implement several interfaces...
  implementsClause
  	:	(
  			i:"implements"! identifier ( COMMA! identifier )*
  		)?
  		{#implementsClause = #(#[IMPLEMENTS_CLAUSE,"IMPLEMENTS_CLAUSE"],
  								 #implementsClause);}
  	;
  
  // Now the various things that can be defined inside a class or interface...
  // Note that not all of these are really valid in an interface (constructors,
  //   for example), and if this grammar were used for a compiler there would
  //   need to be some semantic checks to make sure we're doing the right thing...
  field!
  	:	// method, constructor, or variable declaration
  		mods:modifiers
  		(	h:ctorHead s:compoundStatement // constructor
  			{#field = #(#[CTOR_DEF,"CTOR_DEF"], mods, h, s);}
  
  		|	cd:classDefinition[#mods]       // inner class
  			{#field = #cd;}
  			
  		|	id:interfaceDefinition[#mods]   // inner interface
  			{#field = #id;}
  
  		|	t:typeSpec[false]  // method or variable declaration(s)
  			(	IDENT  // the name of the method
  
  				// parse the formal parameter declarations.
  				LPAREN! param:parameterDeclarationList RPAREN!
  
  				rt:returnTypeBrackersOnEndOfMethodHead[#t]
  
  				// get the list of exceptions that this method is declared to throw
  				(tc:throwsClause)?
  
  				( s2:compoundStatement | SEMI )
  				{#field = #(#[METHOD_DEF,"METHOD_DEF"],
  						     mods,
  							 #(#[TYPE,"TYPE"],rt),
  							 IDENT,
  							 param,
  							 tc,
  							 s2);}
  			|	v:variableDefinitions[#mods,#t] SEMI
  //				{#field = #(#[VARIABLE_DEF,"VARIABLE_DEF"], v);}
  				{#field = #v;}
  			)
  		)
  
      // "static { ... }" class initializer
  	|	"static" s3:compoundStatement
  		{#field = #(#[STATIC_INIT,"STATIC_INIT"], s3);}
  
      // "{ ... }" instance initializer
  	|	s4:compoundStatement
  		{#field = #(#[INSTANCE_INIT,"INSTANCE_INIT"], s4);}
  	;
  
  variableDefinitions[AST mods, AST t]
  	:	variableDeclarator[getASTFactory().dupTree(mods),
  						   getASTFactory().dupTree(t)]
  		(	COMMA!
  			variableDeclarator[getASTFactory().dupTree(mods),
  							   getASTFactory().dupTree(t)]
  		)*
  	;
  
  /** Declaration of a variable.  This can be a class/instance variable,
   *   or a local variable in a method
   * It can also include possible initialization.
   */
  variableDeclarator![AST mods, AST t]
  	:	id:IDENT d:declaratorBrackets[t] v:varInitializer
  		{#variableDeclarator = #(#[VARIABLE_DEF,"VARIABLE_DEF"], mods, #(#[TYPE,"TYPE"],d), id, v);}
  	;
  
  declaratorBrackets[AST typ]
  	:	{#declaratorBrackets=typ;}
  		(lb:LBRACK^ {#lb.setType(ARRAY_DECLARATOR);} RBRACK!)*
  	;
  
  varInitializer
  	:	( ASSIGN^ initializer )?
  	;
  
  // This is an initializer used to set up an array.
  arrayInitializer
  	:	lc:LCURLY^ {#lc.setType(ARRAY_INIT);}
  			(	initializer
  				(
  					// CONFLICT: does a COMMA after an initializer start a new
  					//           initializer or start the option ',' at end?
  					//           ANTLR generates proper code by matching
  					//			 the comma as soon as possible.
  					options {
  						warnWhenFollowAmbig = false;
  					}
  				:
  					COMMA! initializer
  				)*
  				(COMMA!)?
  			)?
  		RCURLY!
  	;
  
  
  // The two "things" that can initialize an array element are an expression
  //   and another (nested) array initializer.
  initializer
  	:	expression
  	|	arrayInitializer
  	;
  
  // This is the header of a method.  It includes the name and parameters
  //   for the method.
  //   This also watches for a list of exception classes in a "throws" clause.
  ctorHead
  	:	IDENT  // the name of the method
  
  		// parse the formal parameter declarations.
  		LPAREN! parameterDeclarationList RPAREN!
  
  		// get the list of exceptions that this method is declared to throw
  		(throwsClause)?
  	;
  
  // This is a list of exception classes that the method is declared to throw
  throwsClause
  	:	"throws"^ identifier ( COMMA! identifier )*
  	;
  
  
  returnTypeBrackersOnEndOfMethodHead[AST typ]
  	:	{#returnTypeBrackersOnEndOfMethodHead = typ;}
  		(lb:LBRACK^ {#lb.setType(ARRAY_DECLARATOR);} RBRACK!)*
  	;
  
  // A list of formal parameters
  parameterDeclarationList
  	:	( parameterDeclaration ( COMMA! parameterDeclaration )* )?
  		{#parameterDeclarationList = #(#[PARAMETERS,"PARAMETERS"],
  									#parameterDeclarationList);}
  	;
  
  // A formal parameter.
  parameterDeclaration!
  	:	pm:parameterModifier t:typeSpec[false] id:IDENT
  		pd:parameterDeclaratorBrackets[#t]
  		{#parameterDeclaration = #(#[PARAMETER_DEF,"PARAMETER_DEF"],
  									pm, #([TYPE,"TYPE"],pd), id);}
  	;
  
  parameterDeclaratorBrackets[AST t]
  	:	{#parameterDeclaratorBrackets = t;}
  		(lb:LBRACK^ {#lb.setType(ARRAY_DECLARATOR);} RBRACK!)*
  	;
  
  parameterModifier
  	:	(f:"final")?
  		{#parameterModifier = #(#[MODIFIERS,"MODIFIERS"], f);}
  	;
  
  // Compound statement.  This is used in many contexts:
  //   Inside a class definition prefixed with "static":
  //      it is a class initializer
  //   Inside a class definition without "static":
  //      it is an instance initializer
  //   As the body of a method
  //   As a completely indepdent braced block of code inside a method
  //      it starts a new scope for variable definitions
  
  compoundStatement
  	:	lc:LCURLY^ {#lc.setType(SLIST);}
  			// include the (possibly-empty) list of statements
  			(statement)*
  		RCURLY!
  	;
  
  
  statement
  	// A list of statements in curly braces -- start a new scope!
  	:	compoundStatement
  
  	// class definition
  	|	classDefinition[#[MODIFIERS, "MODIFIERS"]]
  
  	// final class definition
  	|	"final"! classDefinition[#(#[MODIFIERS, "MODIFIERS"],#[FINAL,"final"])]
  
  	// abstract class definition
  	|	"abstract"! classDefinition[#(#[MODIFIERS, "MODIFIERS"],#[ABSTRACT,"abstract"])]
  
  	// declarations are ambiguous with "ID DOT" relative to expression
  	// statements.  Must backtrack to be sure.  Could use a semantic
  	// predicate to test symbol table to see what the type was coming
  	// up, but that's pretty hard without a symbol table ;)
  	|	(declaration)=> declaration SEMI!
  
  	// An expression statement.  This could be a method call,
  	// assignment statement, or any other expression evaluated for
  	// side-effects.
  	|	expression SEMI!
  
  	// Attach a label to the front of a statement
  	|	IDENT c:COLON^ {#c.setType(LABELED_STAT);} statement
  
  	// If-else statement
  	|	"if"^ LPAREN! expression RPAREN! statement
  		(
  			// CONFLICT: the old "dangling-else" problem...
  			//           ANTLR generates proper code matching
  			//			 as soon as possible.  Hush warning.
  			options {
  				warnWhenFollowAmbig = false;
  			}
  		:
  			"else"! statement
  		)?
  
  	// For statement
  	|	"for"^
  			LPAREN!
  				forInit SEMI!   // initializer
  				forCond	SEMI!   // condition test
  				forIter         // updater
  			RPAREN!
  			statement                     // statement to loop over
  
  	// While statement
  	|	"while"^ LPAREN! expression RPAREN! statement
  
  	// do-while statement
  	|	"do"^ statement "while"! LPAREN! expression RPAREN! SEMI!
  
  	// get out of a loop (or switch)
  	|	"break"^ (IDENT)? SEMI!
  
  	// do next iteration of a loop
  	|	"continue"^ (IDENT)? SEMI!
  
  	// Return an expression
  	|	"return"^ (expression)? SEMI!
  
  	// switch/case statement
  	|	"switch"^ LPAREN! expression RPAREN! LCURLY!
  			( casesGroup )*
  		RCURLY!
  
  	// exception try-catch block
  	|	tryBlock
  
  	// throw an exception
  	|	"throw"^ expression SEMI!
  
  	// synchronize a statement
  	|	"synchronized"^ LPAREN! expression RPAREN! compoundStatement
  
  	// empty statement
  	|	s:SEMI {#s.setType(EMPTY_STAT);}
  	;
  
  
  casesGroup
  	:	(	// CONFLICT: to which case group do the statements bind?
  			//           ANTLR generates proper code: it groups the
  			//           many "case"/"default" labels together then
  			//           follows them with the statements
  			options {
  				warnWhenFollowAmbig = false;
  			}
  			:
  			aCase
  		)+
  		caseSList
  		{#casesGroup = #([CASE_GROUP, "CASE_GROUP"], #casesGroup);}
  	;
  
  aCase
  	:	("case"^ expression | "default") COLON!
  	;
  
  caseSList
  	:	(statement)*
  		{#caseSList = #(#[SLIST,"SLIST"],#caseSList);}
  	;
  
  // The initializer for a for loop
  forInit
  		// if it looks like a declaration, it is
  	:	(	(declaration)=> declaration
  		// otherwise it could be an expression list...
  		|	expressionList
  		)?
  		{#forInit = #(#[FOR_INIT,"FOR_INIT"],#forInit);}
  	;
  
  forCond
  	:	(expression)?
  		{#forCond = #(#[FOR_CONDITION,"FOR_CONDITION"],#forCond);}
  	;
  
  forIter
  	:	(expressionList)?
  		{#forIter = #(#[FOR_ITERATOR,"FOR_ITERATOR"],#forIter);}
  	;
  
  // an exception handler try/catch block
  tryBlock
  	:	"try"^ compoundStatement
  		(handler)*
  		( "finally"^ compoundStatement )?
  	;
  
  
  // an exception handler
  handler
  	:	"catch"^ LPAREN! parameterDeclaration RPAREN! compoundStatement
  	;
  
  
  // expressions
  // Note that most of these expressions follow the pattern
  //   thisLevelExpression :
  //       nextHigherPrecedenceExpression
  //           (OPERATOR nextHigherPrecedenceExpression)*
  // which is a standard recursive definition for a parsing an expression.
  // The operators in java have the following precedences:
  //    lowest  (13)  = *= /= %= += -= <<= >>= >>>= &= ^= |=
  //            (12)  ?:
  //            (11)  ||
  //            (10)  &&
  //            ( 9)  |
  //            ( 8)  ^
  //            ( 7)  &
  //            ( 6)  == !=
  //            ( 5)  < <= > >=
  //            ( 4)  << >>
  //            ( 3)  +(binary) -(binary)
  //            ( 2)  * / %
  //            ( 1)  ++ -- +(unary) -(unary)  ~  !  (type)
  //                  []   () (method call)  . (dot -- identifier qualification)
  //                  new   ()  (explicit parenthesis)
  //
  // the last two are not usually on a precedence chart; I put them in
  // to point out that new has a higher precedence than '.', so you
  // can validy use
  //     new Frame().show()
  // 
  // Note that the above precedence levels map to the rules below...
  // Once you have a precedence chart, writing the appropriate rules as below
  //   is usually very straightfoward
  
  
  
  // the mother of all expressions
  expression
  	:	assignmentExpression
  		{#expression = #(#[EXPR,"EXPR"],#expression);}
  	;
  
  
  // This is a list of expressions.
  expressionList
  	:	expression (COMMA! expression)*
  		{#expressionList = #(#[ELIST,"ELIST"], expressionList);}
  	;
  
  
  // assignment expression (level 13)
  assignmentExpression
  	:	conditionalExpression
  		(	(	ASSIGN^
              |   PLUS_ASSIGN^
              |   MINUS_ASSIGN^
              |   STAR_ASSIGN^
              |   DIV_ASSIGN^
              |   MOD_ASSIGN^
              |   SR_ASSIGN^
              |   BSR_ASSIGN^
              |   SL_ASSIGN^
              |   BAND_ASSIGN^
              |   BXOR_ASSIGN^
              |   BOR_ASSIGN^
              )
  			assignmentExpression
  		)?
  	;
  
  
  // conditional test (level 12)
  conditionalExpression
  	:	logicalOrExpression
  		( QUESTION^ assignmentExpression COLON! conditionalExpression )?
  	;
  
  
  // logical or (||)  (level 11)
  logicalOrExpression
  	:	logicalAndExpression (LOR^ logicalAndExpression)*
  	;
  
  
  // logical and (&&)  (level 10)
  logicalAndExpression
  	:	inclusiveOrExpression (LAND^ inclusiveOrExpression)*
  	;
  
  
  // bitwise or non-short-circuiting or (|)  (level 9)
  inclusiveOrExpression
  	:	exclusiveOrExpression (BOR^ exclusiveOrExpression)*
  	;
  
  
  // exclusive or (^)  (level 8)
  exclusiveOrExpression
  	:	andExpression (BXOR^ andExpression)*
  	;
  
  
  // bitwise or non-short-circuiting and (&)  (level 7)
  andExpression
  	:	equalityExpression (BAND^ equalityExpression)*
  	;
  
  
  // equality/inequality (==/!=) (level 6)
  equalityExpression
  	:	relationalExpression ((NOT_EQUAL^ | EQUAL^) relationalExpression)*
  	;
  
  
  // boolean relational expressions (level 5)
  relationalExpression
  	:	shiftExpression
  		(	(	(	LT^
  				|	GT^
  				|	LE^
  				|	GE^
  				)
  				shiftExpression
  			)*
  		|	"instanceof"^ typeSpec[true]
  		)
  	;
  
  
  // bit shift expressions (level 4)
  shiftExpression
  	:	additiveExpression ((SL^ | SR^ | BSR^) additiveExpression)*
  	;
  
  
  // binary addition/subtraction (level 3)
  additiveExpression
  	:	multiplicativeExpression ((PLUS^ | MINUS^) multiplicativeExpression)*
  	;
  
  
  // multiplication/division/modulo (level 2)
  multiplicativeExpression
  	:	unaryExpression ((STAR^ | DIV^ | MOD^ ) unaryExpression)*
  	;
  
  unaryExpression
  	:	INC^ unaryExpression
  	|	DEC^ unaryExpression
  	|	MINUS^ {#MINUS.setType(UNARY_MINUS);} unaryExpression
  	|	PLUS^  {#PLUS.setType(UNARY_PLUS);} unaryExpression
  	|	unaryExpressionNotPlusMinus
  	;
  
  unaryExpressionNotPlusMinus
  	:	BNOT^ unaryExpression
  	|	LNOT^ unaryExpression
  
  	|	(	// subrule allows option to shut off warnings
  			options {
  				// "(int" ambig with postfixExpr due to lack of sequence
  				// info in linear approximate LL(k).  It's ok.  Shut up.
  				generateAmbigWarnings=false;
  			}
  		:	// If typecast is built in type, must be numeric operand
  			// Also, no reason to backtrack if type keyword like int, float...
  			lpb:LPAREN^ {#lpb.setType(TYPECAST);} builtInTypeSpec[true] RPAREN!
  			unaryExpression
  
  			// Have to backtrack to see if operator follows.  If no operator
  			// follows, it's a typecast.  No semantic checking needed to parse.
  			// if it _looks_ like a cast, it _is_ a cast; else it's a "(expr)"
  		|	(LPAREN classTypeSpec[true] RPAREN unaryExpressionNotPlusMinus)=>
  			lp:LPAREN^ {#lp.setType(TYPECAST);} classTypeSpec[true] RPAREN!
  			unaryExpressionNotPlusMinus
  
  		|	postfixExpression
  		)
  	;
  
  // qualified names, array expressions, method invocation, post inc/dec
  postfixExpression
  	:	primaryExpression // start with a primary
  
  		(	// qualified id (id.id.id.id...) -- build the name
  			DOT^ ( IDENT
  				| "this"
  				| "class"
  				| newExpression
  				| "super" LPAREN ( expressionList )? RPAREN
  				)
  			// the above line needs a semantic check to make sure "class"
  			//   is the _last_ qualifier.
  
  			// allow ClassName[].class
  		|	( lbc:LBRACK^ {#lbc.setType(ARRAY_DECLARATOR);} RBRACK! )+
  			DOT^ "class"
  
  			// an array indexing operation
  		|	lb:LBRACK^ {#lb.setType(INDEX_OP);} expression RBRACK!
  
  			// method invocation
  			// The next line is not strictly proper; it allows x(3)(4) or
  			//  x[2](4) which are not valid in Java.  If this grammar were used
  			//  to validate a Java program a semantic check would be needed, or
  			//   this rule would get really ugly...
  		|	lp:LPAREN^ {#lp.setType(METHOD_CALL);}
  				argList
  			RPAREN!
  		)*
  
  		// possibly add on a post-increment or post-decrement.
  		// allows INC/DEC on too much, but semantics can check
  		(	in:INC^ {#in.setType(POST_INC);}
  	 	|	de:DEC^ {#de.setType(POST_DEC);}
  		|	// nothing
  		)
  
  		// look for int.class and int[].class
  	|	builtInType 
  		( lbt:LBRACK^ {#lbt.setType(ARRAY_DECLARATOR);} RBRACK! )*
  		DOT^ "class"
  	;
  
  // the basic element of an expression
  primaryExpression
  	:	IDENT
  	|	newExpression
  	|	constant
  	|	"super"
  	|	"true"
  	|	"false"
  	|	"this"
  	|	"null"
  	|	LPAREN! assignmentExpression RPAREN!
  	;
  
  /** object instantiation.
   *  Trees are built as illustrated by the following input/tree pairs:
   *  
   *  new T()
   *  
   *  new
   *   |
   *   T --  ELIST
   *           |
   *          arg1 -- arg2 -- .. -- argn
   *  
   *  new int[]
   *
   *  new
   *   |
   *  int -- ARRAY_DECLARATOR
   *  
   *  new int[] {1,2}
   *
   *  new
   *   |
   *  int -- ARRAY_DECLARATOR -- ARRAY_INIT
   *                                  |
   *                                EXPR -- EXPR
   *                                  |      |
   *                                  1      2
   *  
   *  new int[3]
   *  new
   *   |
   *  int -- ARRAY_DECLARATOR
   *                |
   *              EXPR
   *                |
   *                3
   *  
   *  new int[1][2]
   *  
   *  new
   *   |
   *  int -- ARRAY_DECLARATOR
   *               |
   *         ARRAY_DECLARATOR -- EXPR
   *               |              |
   *             EXPR             1
   *               |
   *               2
   *  
   */
  newExpression
  	:	"new"^ type
  		(	LPAREN! argList RPAREN! (classBlock)?
  
  			//java 1.1
  			// Note: This will allow bad constructs like
  			//    new int[4][][3] {exp,exp}.
  			//    There needs to be a semantic check here...
  			// to make sure:
  			//   a) [ expr ] and [ ] are not mixed
  			//   b) [ expr ] and an init are not used together
  
  		|	newArrayDeclarator (arrayInitializer)?
  		)
  	;
  
  argList
  	:	(	expressionList
  		|	/*nothing*/
  			{#argList = #[ELIST,"ELIST"];}
  		)
  	;
  
  newArrayDeclarator
  	:	(
  			// CONFLICT:
  			// newExpression is a primaryExpression which can be
  			// followed by an array index reference.  This is ok,
  			// as the generated code will stay in this loop as
  			// long as it sees an LBRACK (proper behavior)
  			options {
  				warnWhenFollowAmbig = false;
  			}
  		:
  			lb:LBRACK^ {#lb.setType(ARRAY_DECLARATOR);}
  				(expression)?
  			RBRACK!
  		)+
  	;
  
  constant
  	:	NUM_INT
  	|	CHAR_LITERAL
  	|	STRING_LITERAL
  	|	NUM_FLOAT
  	;
  
  
  //----------------------------------------------------------------------------
  // The Java scanner
  //----------------------------------------------------------------------------
  class JavaLexer extends Lexer;
  
  options {
  	exportVocab=Java;      // call the vocabulary "Java"
  	testLiterals=false;    // don't automatically test for literals
  	k=4;                   // four characters of lookahead
  //	charVocabulary='\u0003'..'\uFFFF';
  }
  
  
  
  // OPERATORS
  QUESTION		:	'?'		;
  LPAREN			:	'('		;
  RPAREN			:	')'		;
  LBRACK			:	'['		;
  RBRACK			:	']'		;
  LCURLY			:	'{'		;
  RCURLY			:	'}'		;
  COLON			:	':'		;
  COMMA			:	','		;
  //DOT			:	'.'		;
  ASSIGN			:	'='		;
  EQUAL			:	"=="	;
  LNOT			:	'!'		;
  BNOT			:	'~'		;
  NOT_EQUAL		:	"!="	;
  DIV				:	'/'		;
  DIV_ASSIGN		:	"/="	;
  PLUS			:	'+'		;
  PLUS_ASSIGN		:	"+="	;
  INC				:	"++"	;
  MINUS			:	'-'		;
  MINUS_ASSIGN	:	"-="	;
  DEC				:	"--"	;
  STAR			:	'*'		;
  STAR_ASSIGN		:	"*="	;
  MOD				:	'%'		;
  MOD_ASSIGN		:	"%="	;
  SR				:	">>"	;
  SR_ASSIGN		:	">>="	;
  BSR				:	">>>"	;
  BSR_ASSIGN		:	">>>="	;
  GE				:	">="	;
  GT				:	">"		;
  SL				:	"<<"	;
  SL_ASSIGN		:	"<<="	;
  LE				:	"<="	;
  LT				:	'<'		;
  BXOR			:	'^'		;
  BXOR_ASSIGN		:	"^="	;
  BOR				:	'|'		;
  BOR_ASSIGN		:	"|="	;
  LOR				:	"||"	;
  BAND			:	'&'		;
  BAND_ASSIGN		:	"&="	;
  LAND			:	"&&"	;
  SEMI			:	';'		;
  
  
  // Whitespace -- ignored
  WS	:	(	' '
  		|	'\t'
  		|	'\f'
  		// handle newlines
  		|	(	"\r\n"  // Evil DOS
  			|	'\r'    // Macintosh
  			|	'\n'    // Unix (the right way)
  			)
  			{ newline(); }
  		)
  		{ _ttype = Token.SKIP; }
  	;
  
  // Single-line comments
  SL_COMMENT
  	:	"//"
  		(~('\n'|'\r'))* ('\n'|'\r'('\n')?)
  		{$setType(Token.SKIP); newline();}
  	;
  
  // multiple-line comments
  ML_COMMENT
  	:	"/*"
  		(	/*	'\r' '\n' can be matched in one alternative or by matching
  				'\r' in one iteration and '\n' in another.  I am trying to
  				handle any flavor of newline that comes in, but the language
  				that allows both "\r\n" and "\r" and "\n" to all be valid
  				newline is ambiguous.  Consequently, the resulting grammar
  				must be ambiguous.  I'm shutting this warning off.
  			 */
  			options {
  				generateAmbigWarnings=false;
  			}
  		:
  			{ LA(2)!='/' }? '*'
  		|	'\r' '\n'		{newline();}
  		|	'\r'			{newline();}
  		|	'\n'			{newline();}
  		|	~('*'|'\n'|'\r')
  		)*
  		"*/"
  		{$setType(Token.SKIP);}
  	;
  
  
  // character literals
  CHAR_LITERAL
  	:	'\'' ( ESC | ~'\'' ) '\''
  	;
  
  // string literals
  STRING_LITERAL
  	:	'"' (ESC|~('"'|'\\'))* '"'
  	;
  
  
  // escape sequence -- note that this is protected; it can only be called
  //   from another lexer rule -- it will not ever directly return a token to
  //   the parser
  // There are various ambiguities hushed in this rule.  The optional
  // '0'...'9' digit matches should be matched here rather than letting
  // them go back to STRING_LITERAL to be matched.  ANTLR does the
  // right thing by matching immediately; hence, it's ok to shut off
  // the FOLLOW ambig warnings.
  protected
  ESC
  	:	'\\'
  		(	'n'
  		|	'r'
  		|	't'
  		|	'b'
  		|	'f'
  		|	'"'
  		|	'\''
  		|	'\\'
  		|	('u')+ HEX_DIGIT HEX_DIGIT HEX_DIGIT HEX_DIGIT 
  		|	('0'..'3')
  			(
  				options {
  					warnWhenFollowAmbig = false;
  				}
  			:	('0'..'7')
  				(	
  					options {
  						warnWhenFollowAmbig = false;
  					}
  				:	'0'..'7'
  				)?
  			)?
  		|	('4'..'7')
  			(
  				options {
  					warnWhenFollowAmbig = false;
  				}
  			:	('0'..'9')
  			)?
  		)
  	;
  
  
  // hexadecimal digit (again, note it's protected!)
  protected
  HEX_DIGIT
  	:	('0'..'9'|'A'..'F'|'a'..'f')
  	;
  
  
  // a dummy rule to force vocabulary to be all characters (except special
  //   ones that ANTLR uses internally (0 to 2)
  protected
  VOCAB
  	:	'\3'..'\377'
  	;
  
  
  // an identifier.  Note that testLiterals is set to true!  This means
  // that after we match the rule, we look in the literals table to see
  // if it's a literal or really an identifer
  IDENT
  	options {testLiterals=true;}
  	:	('a'..'z'|'A'..'Z'|'_'|'$') ('a'..'z'|'A'..'Z'|'_'|'0'..'9'|'$')*
  	;
  
  
  // a numeric literal
  NUM_INT
  	{boolean isDecimal=false;}
  	:	'.' {_ttype = DOT;}
  			(('0'..'9')+ (EXPONENT)? (FLOAT_SUFFIX)? { _ttype = NUM_FLOAT; })?
  	|	(	'0' {isDecimal = true;} // special case for just '0'
  			(	('x'|'X')
  				(											// hex
  					// the 'e'|'E' and float suffix stuff look
  					// like hex digits, hence the (...)+ doesn't
  					// know when to stop: ambig.  ANTLR resolves
  					// it correctly by matching immediately.  It
  					// is therefor ok to hush warning.
  					options {
  						warnWhenFollowAmbig=false;
  					}
  				:	HEX_DIGIT
  				)+
  			|	('0'..'7')+									// octal
  			)?
  		|	('1'..'9') ('0'..'9')*  {isDecimal=true;}		// non-zero decimal
  		)
  		(	('l'|'L')
  		
  		// only check to see if it's a float if looks like decimal so far
  		|	{isDecimal}?
  			(	'.' ('0'..'9')* (EXPONENT)? (FLOAT_SUFFIX)?
  			|	EXPONENT (FLOAT_SUFFIX)?
  			|	FLOAT_SUFFIX
  			)
  			{ _ttype = NUM_FLOAT; }
  		)?
  	;
  
  
  // a couple protected methods to assist in matching floating point numbers
  protected
  EXPONENT
  	:	('e'|'E') ('+'|'-')? ('0'..'9')+
  	;
  
  
  protected
  FLOAT_SUFFIX
  	:	'f'|'F'|'d'|'D'
  	;
  
  
  
  
  1.1                  jakarta-alexandria/proposal/jxr2/src/java/org/apache/alexandria/jxr/JavaSAXLiaison.java
  
  Index: JavaSAXLiaison.java
  ===================================================================
  package org.apache.alexandria.jxr;
  
  import org.apache.xalan.xpath.xml.*;
  import org.apache.xalan.xpath.*;
  import org.apache.xalan.xpath.XLocator;
  import org.xml.sax.*;
  import java.util.*;
  import java.net.*;
  import org.w3c.dom.*;
  
  public class JavaSAXLiaison extends XMLParserLiaisonDefault{
      private JavaSAXParser parser = new JavaSAXParser();
      public void parse(InputSource source) throws SAXException {
          parser.parse(source);
      }
      public void setDocumentHandler(DocumentHandler handler){
          parser.setDocumentHandler(handler);
      }
  }
  
  
  
  1.1                  jakarta-alexandria/proposal/jxr2/src/java/org/apache/alexandria/jxr/JavaSAXParser.java
  
  Index: JavaSAXParser.java
  ===================================================================
  package org.apache.alexandria.jxr;
  
  import javax.xml.parsers.*;
  import org.xml.sax.*;
  import org.xml.sax.helpers.*;
  import java.util.*;
  import antlr.collections.*;
  import antlr.*;
  import java.io.*;
  import org.apache.xalan.xpath.xml.*;
  import org.w3c.dom.*;
  
  /**
   * JavaSAXParser generates SAX event from a java source file.
   * This allows the Java source to be converted into an XML
   * representation of the java code.
   */
  public class JavaSAXParser extends SAXParser implements JavaTokenTypes, org.xml.sax.Parser{
  
       /** DocumentHandler used to listen to the parser */
       private DocumentHandler docHandler=null;
       /** Conversion table from token id to XML tag name */
       private static String[] tag = new String[FLOAT_SUFFIX+1];
  
       /** Lookup for supressing text content */
       private boolean[] quiet = new boolean[tag.length];
  
       /**
        * Construct a new Parser.
        * Setup the quiet table.
        */
       public JavaSAXParser(){
           
  	 tag[EOF]="";
  	 tag[NULL_TREE_LOOKAHEAD]="";
  	 tag[BLOCK]="block";
  	 tag[MODIFIERS]="modifiers";
  	 tag[OBJBLOCK]="class-block";
  	 tag[SLIST]="method-block";
  	 tag[CTOR_DEF]="constructor";
  	 tag[METHOD_DEF]="method_def";
  	 tag[VARIABLE_DEF]="variable";
  	 tag[INSTANCE_INIT]="instance_init";
  	 tag[STATIC_INIT]="static_init";
  	 tag[TYPE]="type";
  	 tag[CLASS_DEF]="class";
  	 tag[INTERFACE_DEF]="interface_def";
  	 tag[PACKAGE_DEF]="package";
  	 tag[ARRAY_DECLARATOR]="array_declarator";
  	 tag[EXTENDS_CLAUSE]="extends";
  	 tag[IMPLEMENTS_CLAUSE]="implements";
  	 tag[PARAMETERS]="parameters";
  	 tag[PARAMETER_DEF]="parameter_def";
  	 tag[LABELED_STAT]="labeled_stat";
  	 tag[TYPECAST]="typecast";
  	 tag[INDEX_OP]="index_op";
  	 tag[POST_INC]="post_inc";
  	 tag[POST_DEC]="post_dec";
  	 tag[METHOD_CALL]="method_call";
  	 tag[EXPR]="expr";
  	 tag[ARRAY_INIT]="array_init";
  	 tag[IMPORT]="import";
  	 tag[UNARY_MINUS]="unary_minus";
  	 tag[UNARY_PLUS]="unary_plus";
  	 tag[CASE_GROUP]="case_group";
  	 tag[ELIST]="elist";
  	 tag[FOR_INIT]="for_init";
  	 tag[FOR_CONDITION]="for_condition";
  	 tag[FOR_ITERATOR]="for_iterator";
  	 tag[EMPTY_STAT]="empty_stat";
  	 tag[FINAL]="final";
  	 tag[ABSTRACT]="abstract";
  	 tag[LITERAL_package]="literal_package";
  	 tag[SEMI]="semi";
  	 tag[LITERAL_import]="literal_import";
  	 tag[LBRACK]="lbrack";
  	 tag[RBRACK]="rbrack";
  	 tag[LITERAL_void]="literal_void";
  	 tag[LITERAL_boolean]="boolean";
  	 tag[LITERAL_byte]="literal_byte";
  	 tag[LITERAL_char]="literal_char";
  	 tag[LITERAL_short]="literal_short";
  	 tag[LITERAL_int]="literal_int";
  	 tag[LITERAL_float]="literal_float";
  	 tag[LITERAL_long]="literal_long";
  	 tag[LITERAL_double]="literal_double";
  	 tag[IDENT]="ident";
  	 tag[DOT]="dot";
  	 tag[STAR]="star";
  	 tag[LITERAL_private]="literal_private";
  	 tag[LITERAL_public]="literal_public";
  	 tag[LITERAL_protected]="literal_protected";
  	 tag[LITERAL_static]="literal_static";
  	 tag[LITERAL_transient]="literal_transient";
  	 tag[LITERAL_native]="literal_native";
  	 tag[LITERAL_threadsafe]="literal_threadsafe";
  	 tag[LITERAL_synchronized]="literal_synchronized";
  	 tag[LITERAL_volatile]="literal_volatile";
  	 tag[LITERAL_class]="literal_class";
  	 tag[LITERAL_extends]="literal_extends";
  	 tag[LITERAL_interface]="literal_interface";
  	 tag[LCURLY]="lcurly";
  	 tag[RCURLY]="rcurly";
  	 tag[COMMA]="comma";
  	 tag[LITERAL_implements]="literal_implements";
  	 tag[LPAREN]="lparen";
  	 tag[RPAREN]="rparen";
  	 tag[ASSIGN]="assign";
  	 tag[LITERAL_throws]="literal_throws";
  	 tag[COLON]="colon";
  	 tag[LITERAL_if]="literal_if";
  	 tag[LITERAL_else]="literal_else";
  	 tag[LITERAL_for]="literal_for";
  	 tag[LITERAL_while]="literal_while";
  	 tag[LITERAL_do]="literal_do";
  	 tag[LITERAL_break]="literal_break";
  	 tag[LITERAL_continue]="literal_continue";
  	 tag[LITERAL_return]="literal_return";
  	 tag[LITERAL_switch]="literal_switch";
  	 tag[LITERAL_throw]="literal_throw";
  	 tag[LITERAL_case]="literal_case";
  	 tag[LITERAL_default]="literal_default";
  	 tag[LITERAL_try]="try";
  	 tag[LITERAL_finally]="literal_finally";
  	 tag[LITERAL_catch]="literal_catch";
  	 tag[PLUS_ASSIGN]="plus_assign";
  	 tag[MINUS_ASSIGN]="minus_assign";
  	 tag[STAR_ASSIGN]="star_assign";
  	 tag[DIV_ASSIGN]="div_assign";
  	 tag[MOD_ASSIGN]="mod_assign";
  	 tag[SR_ASSIGN]="sr_assign";
  	 tag[BSR_ASSIGN]="bsr_assign";
  	 tag[SL_ASSIGN]="sl_assign";
  	 tag[BAND_ASSIGN]="band_assign";
  	 tag[BXOR_ASSIGN]="bxor_assign";
  	 tag[BOR_ASSIGN]="bor_assign";
  	 tag[QUESTION]="question";
  	 tag[LOR]="lor";
  	 tag[LAND]="land";
  	 tag[BOR]="bor";
  	 tag[BXOR]="bxor";
  	 tag[BAND]="band";
  	 tag[NOT_EQUAL]="not_equal";
  	 tag[EQUAL]="equal";
  	 tag[LT]="lt";
  	 tag[GT]="gt";
  	 tag[LE]="le";
  	 tag[GE]="ge";
  	 tag[LITERAL_instanceof]="literal_instanceof";
  	 tag[SL]="sl";
  	 tag[SR]="sr";
  	 tag[BSR]="bsr";
  	 tag[PLUS]="plus";
  	 tag[MINUS]="minus";
  	 tag[DIV]="div";
  	 tag[MOD]="mod";
  	 tag[INC]="inc";
  	 tag[DEC]="dec";
  	 tag[BNOT]="bnot";
  	 tag[LNOT]="lnot";
  	 tag[LITERAL_this]="literal_this";
  	 tag[LITERAL_super]="literal_super";
  	 tag[LITERAL_true]="true";
  	 tag[LITERAL_false]="literal_false";
  	 tag[LITERAL_null]="literal_null";
  	 tag[LITERAL_new]="literal_new";
  	 tag[NUM_INT]="num_int";
  	 tag[CHAR_LITERAL]="char_literal";
  	 tag[STRING_LITERAL]="string_literal";
  	 tag[NUM_FLOAT]="num_float";
  	 tag[WS]="ws";
  	 tag[SL_COMMENT]="sl_comment";
  	 tag[ML_COMMENT]="ml_comment";
  	 tag[ESC]="esc";
  	 tag[HEX_DIGIT]="hex_digit";
  	 tag[VOCAB]="vocab";
  	 tag[EXPONENT]="exponent";
  	 tag[FLOAT_SUFFIX]="float_suffix";
  
           quiet[DOT]=true;
           quiet[PACKAGE_DEF]=true;
           quiet[IMPORT]=true;
           quiet[STAR]=true;
           quiet[CLASS_DEF]=true;
           quiet[MODIFIERS]=true;
           quiet[EXTENDS_CLAUSE]=true;
           quiet[IMPLEMENTS_CLAUSE]=true;
           quiet[OBJBLOCK]=true;
           quiet[VARIABLE_DEF]=true;
           quiet[TYPE]=true;
           quiet[EXPR]=true;
           quiet[CTOR_DEF]=true;
           quiet[PARAMETERS]=true;
           quiet[PARAMETER_DEF]=true;
           quiet[ELIST]=true;
           quiet[METHOD_DEF]=true;
           quiet[SLIST]=true;
           quiet[LITERAL_try]=true;
           quiet[LITERAL_boolean]=true;
           quiet[ASSIGN]=true;
           quiet[LITERAL_true]=true;
       }
  
       /**
        * <strong>Unused</strong>
        * @throws RuntimeException when called
        */
       public void setProperty(String s,Object o){
           throw new RuntimeException("Method not supported");
       }
  
       /**
        * <strong>Unused</strong>
        * @throws RuntimeException when called
        */
       public Object getProperty(String s){
           throw new RuntimeException("Method not supported");
       }
  
       /**
        * Is parser validating? No!.
        * @return Always returns false.
        */
       public boolean isValidating(){
           return false;
       }
  
       /**
        * Is parser namespace aware? No!.
        * @return Always returns false.
        */
       public boolean isNamespaceAware(){
           return false;
       }
  
       /**
        * <strong>Unused</strong>
        * @throws RuntimeException when called
        */
       public XMLReader getXMLReader(){
           throw new RuntimeException("Method not supported");
       }
  
       /**
        * Return a parser.
        * @return this, seems a bit wierd. Must be something wrong
        */
       public org.xml.sax.Parser getParser(){
           return this;
       }
  
       /**
        * Parser a Java source file provided by the InputSource
        */
       public void parse(InputSource source) throws SAXException {
          JavaLexer lexer = new JavaLexer(source.getCharacterStream());
          JavaRecognizer parser = new JavaRecognizer( lexer );
  
          try{
              parser.compilationUnit();
          }catch(RecognitionException e){
              throw new SAXException(e);
          }catch(TokenStreamException e){
              throw new SAXException(e);
          }
  
          AST ast = parser.getAST();
          if(docHandler==null)throw new SAXException("DocumentHandler not set");
          docHandler.startDocument();
          docHandler.startElement("java", null);
          parse(ast);
          docHandler.endDocument();
          docHandler.endElement("java");
       }
  
       /**
        * Recurse through the parsed tree generating SAX events
        */
       private void parse(AST ast)throws SAXException {
          while(ast!=null){
              docHandler.startElement( tag[ast.getType()], null);
              if(!quiet[ast.getType()]){
                  docHandler.characters(ast.getText().toCharArray(), 0, ast.getText().length());
              }
              parse(ast.getFirstChild());
              docHandler.endElement( tag[ast.getType()]);
              ast = ast.getNextSibling();
          }
       }
  
  
       /**
        * <strong>Unused</strong>
        * @throws RuntimeException when called
        */
       public void parse(String systemId){
           throw new RuntimeException("Method not supported");
       }
  
       /**
        * Set the DocumentHandler used to listen to SAX events
        * generated by parsing a Java source file
        */
       public void setDocumentHandler(DocumentHandler handler){
           this.docHandler = handler;
       }
  
       /**
        * <strong>Unused</strong>
        * @throws RuntimeException when called
        */
       public void setDTDHandler(DTDHandler handler){
           throw new RuntimeException("Method not supported");
       }
  
       /**
        * <strong>Unused</strong>
        * @throws RuntimeException when called
        */
       public void setEntityResolver(EntityResolver resolver){
           throw new RuntimeException("Method not supported");
       }
  
       /**
        * <strong>Unused</strong>
        * @throws RuntimeException when called
        */
       public void setErrorHandler(ErrorHandler handler){
           throw new RuntimeException("Method not supported");
       }
  
       /**
        * <strong>Unused</strong>
        * @throws RuntimeException when called
        */
       public void setLocale(Locale locale){
           throw new RuntimeException("Method not supported");
       }
  
  }
  
  
  
  1.1                  jakarta-alexandria/proposal/jxr2/src/java/org/apache/alexandria/jxr/Jxr.java
  
  Index: Jxr.java
  ===================================================================
  package org.apache.alexandria.jxr;
  
  import org.apache.tools.ant.*;
  import org.apache.tools.ant.types.*;
  import java.util.*;
  import java.io.*;
  import org.xml.sax.*;
  import org.apache.xml.serialize.*;
  
  public class Jxr extends Task{
      private final Vector filesets = new Vector();
      private final JavaSAXParser parser = new JavaSAXParser();
      private File styleSheet = null;
      private File outputDir = null;
  
      /**
       * Set the class to be use for rendering JXR output
       */
      public void setStyle(File styleSheet){
          this.styleSheet = styleSheet;
      }
  
      public void addFileSet(FileSet fileSet){
          filesets.addElement(fileSet);
      }
  
      public void setOutdir(File outputDir){
          this.outputDir = outputDir;
      }
  
      public void execute() throws BuildException{
          if(filesets.size()==0){
              throw new BuildException("Nested fileset required");
          }
  
          if(styleSheet==null){
              throw new BuildException("Stylesheet required");
          }
  
          if(outputDir==null){
              throw new BuildException("output dir required");
          }
  
          if(!outputDir.isDirectory()){
              throw new BuildException("Cannot find outdir " + outputDir);
          }
  
          try{
              for(Enumeration e=filesets.elements();e.hasMoreElements();){
  
                  FileSet fileSet = (FileSet)e.nextElement();
  
                  DirectoryScanner scanner = fileSet.getDirectoryScanner(project);
  
                  scanner.scan();
  
                  String[] files = scanner.getIncludedFiles();
                  for(int i=0; i<files.length;i++){
                      File outFile = new File(outputDir + System.getProperty("file.separator") + files[i] + ".xml");
                      File inFile = new File(scanner.getBasedir() + System.getProperty("file.separator") + files[i] );
                      outFile.getParentFile().mkdirs();
                      if(inFile.lastModified()>outFile.lastModified()){
                          transform(inFile, outFile);
                      }
                  }
                  
              }
          }catch(Exception e){
              throw new BuildException(e);
          }
      }
      private final void transform(File inFile, File outFile) throws IOException, SAXException {
          log("Parsing file: " + inFile);
          long time = System.currentTimeMillis();
          parser.setDocumentHandler(
              new XMLSerializer(
                  new FileOutputStream(
                      outFile
                  ), null
              )
          );
          parser.parse(new InputSource(new FileReader(inFile)));
          log("Transform took " + (float)(System.currentTimeMillis()-time)/1000 + " secs");
      }
  }
  
  
  
  1.1                  jakarta-alexandria/proposal/jxr2/src/java/org/apache/alexandria/jxr/test_JavaSAXLiaison.java
  
  Index: test_JavaSAXLiaison.java
  ===================================================================
  package org.apache.alexandria.jxr;
  
  import junit.framework.*;
  import org.xml.sax.*;
  import java.io.*;
  
  public class test_JavaSAXLiaison extends TestCase{
      private JavaSAXLiaison liaison = new JavaSAXLiaison();
      public test_JavaSAXLiaison(String name){
          super(name);
      }
      public void setUp() throws Exception {
          liaison = new JavaSAXLiaison();
          liaison.setDocumentHandler(new TestDocumentHandler());
      }
      public void testParse() throws Exception {
          liaison.parse(new InputSource(new StringReader("package org.monkey.test;")));
      }
      public void testSetDocumentHandler(){
          liaison.setDocumentHandler(new TestDocumentHandler());
      }
      private class TestDocumentHandler implements DocumentHandler{
          public void characters(char[] ch, int start, int length){
          }
          public void endDocument(){
          }
          public void endElement(java.lang.String name){
          }
          public void ignorableWhitespace(char[] ch, int start, int length){
          }
          public void processingInstruction(java.lang.String target, java.lang.String data){
          }
          public void setDocumentLocator(Locator locator){
          }
          public void startDocument(){
          }
          public void startElement(java.lang.String name, AttributeList atts){
          }
      }
  }
  
  
  
  1.1                  jakarta-alexandria/proposal/jxr2/src/java/org/apache/alexandria/jxr/test_JavaSAXParser.java
  
  Index: test_JavaSAXParser.java
  ===================================================================
  package org.apache.alexandria.jxr;
  
  import junit.framework.*;
  import org.xml.sax.*;
  import java.io.*;
  import org.apache.xml.serialize.*;
  import org.custommonkey.xmlunit.*;
  
  public class test_JavaSAXParser extends XMLTestCase{
      private JavaSAXParser parser = null;
      private boolean start = false, end = false;
      private String startElement = null, endElement = null;
      public test_JavaSAXParser(String name){
          super(name);
      }
  
      /**
       * Test setProperty
       */
      public void testSetProperty(){
          try{
              parser.setProperty("","");
              fail("Expecting RuntimeException");
          }catch(RuntimeException e){
          }
      }
  
      /**
       * Test getProperty
       */
      public void testGetProperty(String s){
          try{
              parser.getProperty("");
              fail("Expecting RuntimeException");
          }catch(RuntimeException e){
          }
      }
  
      /**
       * Test if parser is validating
       */
      public void testIsValidating(){
          assert(!parser.isValidating());
      }
  
      /**
       * Test if parser is namespace aware
       */
      public void testIsNamespaceAware(){
          assert(!parser.isNamespaceAware());
      }
  
      /**
       * Test getXMLParser
       */
      public void testGetXMLReader(){
          try{
              parser.getXMLReader();
              fail("Expecting RuntimeException");
          }catch(RuntimeException e){
          }
      }
  
      public void setUp(){
          parser = new JavaSAXParser();
          parser.setDocumentHandler(new TestDocumentHandler());
      }
  
      public void testMonkey()throws Exception {
          parser.setDocumentHandler(new XMLSerializer(new FileOutputStream("tmp/test.xml"), null));
          File file = new File("src/java/org/apache/alexandria/jxr/test_JavaSAXParser.java");
          if(!file.exists()){
              fail("Cannot find test file: "+file.getAbsolutePath());
          }
          parser.parse(new InputSource(new FileReader(file)));
      }
  
      public void testParseInputSource() throws Exception {
          setIgnoreWhitespace(true);
          testParse("tests/control1.txt", "tests/test1.txt");
          testParse("tests/control2.txt", "tests/test2.txt");
          testParse("tests/control3.txt", "tests/test3.txt");
          testParse("tests/control4.txt", "tests/test4.txt");
          testParse("tests/control5.txt", "tests/test5.txt");
          /*
          testParse(
              "<java><comment>test</comment></java>",
              "// test");
          */
      }
  
      private void testParse(String xml, String java)throws Exception {
          //setTestParser("org.apache.alexandria.jxr.JavaSAXParser");
          StringWriter writer = new StringWriter();
          parser.setDocumentHandler(new XMLSerializer(writer, null));
          parser.parse(new InputSource(new FileReader(java)));
          assertXMLEqual(xml, new FileReader(xml), new StringReader(writer.toString()));
      }
  
      /*
      public void testSetTestParser()throws Exception {
          try{
              setTestParser("org.apache.alexandria.jxr.JavaSAXParser");
              parser.parse(new InputSource(new StringReader("package")));
          }catch(Exception e){
              fail(e.getMessage());
          }
      }
      */
  
      public void testParseSystemId(){
          try{
              parser.parse("");
              fail("Expecting RuntimeException");
          }catch(RuntimeException e){
          }
      }
      public void testSetDocumentHandler(){
          parser.setDocumentHandler(new TestDocumentHandler());
      }
      public void testSetDTDHandler(){
          try{
              parser.setDTDHandler(null);
              fail("Expecting RuntimeException");
          }catch(RuntimeException e){
          }
      }
      public void testSetEntityResolver(){
          try{
              parser.setEntityResolver(null);
              fail("Expecting RuntimeException");
          }catch(RuntimeException e){
          }
      }
      public void testSetErrorHandler(){
          try{
              parser.setErrorHandler(null);
              fail("Expecting RuntimeException");
          }catch(RuntimeException e){
          }
      }
      public void testSetLocale(){
          try{
              parser.setLocale(null);
              fail("Expecting RuntimeException");
          }catch(RuntimeException e){
          }
      }
  
      public static TestSuite suite(){
          return new TestSuite(test_JavaSAXParser.class);
      }
  
      private class TestDocumentHandler implements DocumentHandler{
          public void characters(char[] ch, int start, int length){
              System.out.println(new String(ch));
          }
          public void endDocument(){
              end = true;
          }
          public void endElement(java.lang.String name){
              System.out.println("</"+name+">");
              endElement = name;
          }
          public void ignorableWhitespace(char[] ch, int start, int length){
          }
          public void processingInstruction(java.lang.String target, java.lang.String data){
          }
          public void setDocumentLocator(Locator locator){
          }
          public void startDocument(){
              start = true;
          }
          public void startElement(java.lang.String name, AttributeList atts){
              System.out.println("<"+name+">");
              startElement = name;
          }
      }
  }
  
  
  
  1.1                  jakarta-alexandria/proposal/jxr2/src/xsl/test.xsl
  
  Index: test.xsl
  ===================================================================
  <?xml version="1.0"?> 
  <xsl:stylesheet xmlns:xsl="http://www.w3.org/1999/XSL/Transform" version="1.0">
  
    <xsl:output indent="no"/>
  
    <!-- Root node -->
    <xsl:template match="/java">
      <html>
        <head>
          <title><xsl:value-of select="@file"/></title>
          <link rel="stylesheet" href="src/css/syntax.css" type="text/css"/>
        </head>
        <body>
          <h1><xsl:value-of select="class/ident"/></h1>
          <pre>
            <xsl:apply-templates />
          </pre>
        </body>
      </html>
    </xsl:template>
  
    <!-- Package -->
    <xsl:template match="package"><span class="key">package</span><xsl:text> </xsl:text><xsl:apply-templates select="ident|dot" />;<xsl:text>
  
  </xsl:text></xsl:template>
  
    <!-- Import -->
    <xsl:template match="import"><span class="key">import</span><xsl:text> </xsl:text><xsl:apply-templates select="ident|dot|star" />;<xsl:text>
  </xsl:text></xsl:template>
  
    <!-- Extends -->
    <xsl:template match="extends"><span class="key"> extends</span><xsl:text> </xsl:text><xsl:apply-templates select="ident|dot|star" />
    </xsl:template>
  
    <!-- Implements -->
    <xsl:template match="implements"> <span class="key">implements</span><xsl:text> </xsl:text><xsl:apply-templates select="ident|dot|star" />
    </xsl:template>
  
    <!-- Identifer stuff -->
    <!-- Identifer stuff -->
    <!-- Identifer stuff -->
    <xsl:template match="ident"><xsl:apply-templates /></xsl:template>
    <xsl:template match="dot">.</xsl:template>
    <xsl:template match="star">*</xsl:template>
  
    <!-- Class -->
    <xsl:template match="class">
      <xsl:text>
  </xsl:text>
      <xsl:apply-templates select="modifiers"/><span class="key">class</span><xsl:text> </xsl:text><xsl:apply-templates select="ident" />
      <xsl:if test="extends/ident">
        <xsl:apply-templates select="extends"/>
      </xsl:if>
      <xsl:if test="implements/ident">
        <xsl:apply-templates select="implements"/>
      </xsl:if><xsl:apply-templates select="objblock" /><xsl:text>
  </xsl:text></xsl:template>
  
    <xsl:template match="objblock">
    {<xsl:apply-templates/>}
    </xsl:template>
  
    <xsl:template match="variable-def">
      <xsl:apply-templates />;
    </xsl:template>
  
    <xsl:template match="type"><xsl:text> </xsl:text><xsl:apply-templates /></xsl:template>
  
    <!-- Modifiers -->
    <xsl:template match="modifiers"><xsl:apply-templates/></xsl:template>
  <xsl:template match="literal-public"><span class="key"><xsl:apply-templates/></span><xsl:text> </xsl:text></xsl:template>
  
    <xsl:template match="literal-false">
      <span class="null">null</span>
    </xsl:template>
  
    <xsl:template match="char-literal">
      <span class="text"><xsl:value-of select="."/></span>
    </xsl:template>
  
  </xsl:stylesheet>
  
  
  
  
  1.1                  jakarta-alexandria/proposal/jxr2/tests/control1.txt
  
  Index: control1.txt
  ===================================================================
  <java><package><ident>org</ident><dot /><ident>apache</ident><dot /><ident>test</ident></package></java>
  
  
  
  1.1                  jakarta-alexandria/proposal/jxr2/tests/control2.txt
  
  Index: control2.txt
  ===================================================================
  <java>
    <package>
      <ident>org</ident><dot/>
      <ident>apache</ident><dot/>
      <ident>test</ident>
    </package>
    <import>
      <ident>org</ident><dot/>
      <ident>apache</ident><dot/>
      <ident>test</ident><dot/><star/>
    </import>
  </java>
  
  
  
  1.1                  jakarta-alexandria/proposal/jxr2/tests/control3.txt
  
  Index: control3.txt
  ===================================================================
  <java>
    <import>
      <ident>org</ident><dot/>
      <ident>apache</ident><dot/>
      <ident>test</ident><dot/><star/>
    </import>
    <class>
      <modifiers/>
      <ident>test</ident>
      <extends/>
      <implements/>
      <class-block/>
    </class>
  </java>
  
  
  
  
  1.1                  jakarta-alexandria/proposal/jxr2/tests/control4.txt
  
  Index: control4.txt
  ===================================================================
  <java>
    <class>
      <modifiers />
  
      <ident>test</ident>
  
      <extends />
  
      <implements />
  
      <class-block>
        <constructor>
          <modifiers />
  
          <ident>test</ident>
  
          <parameters />
  
          <method-block>
            <try>
              <method-block>
                <variable>
  	      	<modifiers/>
  		<type>
  		  <boolean/>
  		</type>
                  <ident>TRUE</ident>
                  <assign>
  		<expr>
  		<true/>
  		</expr>
  		</assign>
  	      </variable>
              </method-block>
            </try>
          </method-block>
        </constructor>
      </class-block>
    </class>
  </java>
  
  
  
  
  1.1                  jakarta-alexandria/proposal/jxr2/tests/control5.txt
  
  Index: control5.txt
  ===================================================================
  <java><package><ident>org</ident><dot/><ident>apache</ident><dot/><ident>test</ident></package><class><modifiers></modifiers><ident>test</ident><extends/><implements/><class-block/></class></java>
  
  
  
  1.1                  jakarta-alexandria/proposal/jxr2/tests/test1.txt
  
  Index: test1.txt
  ===================================================================
  package org.apache.test;
  
  
  
  1.1                  jakarta-alexandria/proposal/jxr2/tests/test2.txt
  
  Index: test2.txt
  ===================================================================
  package org.apache.test;
  import org.apache.test.*;
  
  
  
  1.1                  jakarta-alexandria/proposal/jxr2/tests/test3.txt
  
  Index: test3.txt
  ===================================================================
  import org.apache.test.*;
  class test{}
  
  
  
  1.1                  jakarta-alexandria/proposal/jxr2/tests/test4.txt
  
  Index: test4.txt
  ===================================================================
  class test{ test(){try{ boolean TRUE=true; }}}
  
  
  
  1.1                  jakarta-alexandria/proposal/jxr2/tests/test5.txt
  
  Index: test5.txt
  ===================================================================
  package org.apache.test;
  // package org.apache.test;
  class test{}
  
  
  
  

---------------------------------------------------------------------
To unsubscribe, e-mail: alexandria-dev-unsubscribe@jakarta.apache.org
For additional commands, e-mail: alexandria-dev-help@jakarta.apache.org