Complete 1.04.p: add semantic actions to parser
[tiger.ml.git] / tiger / src / exe / tiger_tests.ml
index b76f368..d9eb050 100644 (file)
@@ -1,6 +1,8 @@
+open Printf
+
 module List = ListLabels
 
-let test_01 =
+let test_case_from_book_01 =
   let name = "an array type and an array variable" in
   let code =
     " \
@@ -15,7 +17,7 @@ let test_01 =
     "
   in
   let tokens =
-    let open Tiger.Parser.Token in
+    let open Tiger.Parser in
     [ LET;
         TYPE; ID "arrtype"; EQ; ARRAY; OF; ID "int";
         VAR; ID "arr1"; COLON; ID "arrtype"; ASSIGN;
@@ -27,7 +29,7 @@ let test_01 =
   in
   (name, code, tokens)
 
-let test_02 =
+let test_case_from_book_02 =
   let name = "arr1 is valid since expression 0 is int = myint" in
   let code =
     " \
@@ -43,7 +45,7 @@ let test_02 =
     "
   in
   let tokens =
-    let open Tiger.Parser.Token in
+    let open Tiger.Parser in
     [ LET;
         TYPE; ID "myint"; EQ; ID "int";
         TYPE; ID "arrtype"; EQ; ARRAY; OF; ID "myint";
@@ -56,7 +58,7 @@ let test_02 =
   in
   (name, code, tokens)
 
-let test_03 =
+let test_case_from_book_03 =
   let name = "a record type and a record variable" in
   let code =
     " \
@@ -78,7 +80,7 @@ let test_03 =
     "
   in
   let tokens =
-    let open Tiger.Parser.Token in
+    let open Tiger.Parser in
     [ LET;
         TYPE; ID "rectype"; EQ;
           LBRACE; ID "name"; COLON; ID "string";
@@ -97,7 +99,7 @@ let test_03 =
   in
   (name, code, tokens)
 
-let test_04 =
+let test_case_from_book_04 =
   let name = "define a recursive function" in
   let code =
     " \
@@ -116,7 +118,7 @@ let test_04 =
     "
   in
   let tokens =
-    let open Tiger.Parser.Token in
+    let open Tiger.Parser in
     [ LET;
         FUNCTION; ID "nfactor"; LPAREN; ID "n"; COLON; ID "int"; RPAREN; COLON; ID "int"; EQ;
           IF; ID "n"; EQ; INT 0;
@@ -129,41 +131,226 @@ let test_04 =
   in
   (name, code, tokens)
 
-let tokens_of_code code =
-  let lexbuf = Lexing.from_string code in
-  let rec tokens () =
-    match Tiger.Lexer.token lexbuf with
-    | None -> []
-    | Some token -> token :: tokens ()
+let test_case_from_book_09 =
+  let name = "error : types of then - else differ" in
+  let code =
+    " \
+    /* "^name^" */ \
+    if (5>4) then 13 else  \" \" \
+    "
   in
-  tokens ()
+  let tokens =
+    let open Tiger.Parser in
+    [ IF; LPAREN; INT 5; GT; INT 4; RPAREN; THEN; INT 13; ELSE; STRING " "
+    ]
+  in
+  (* TODO: Type error test case *)
+  (name, code, tokens)
 
-let tests =
-  [ test_01
-  ; test_02
-  ; test_03
-  ; test_04
+(*
+let test_case_from_book_queens =
+  let code =
+    "\
+    /* A program to solve the 8-queens problem */ \n\
+ \n\
+    let \n\
+      var N := 8 \n\
+ \n\
+      type intArray = array of int \n\
+ \n\
+      var row := intArray [ N ] of 0 \n\
+      var col := intArray [ N ] of 0 \n\
+      var diag1 := intArray [N+N-1] of 0 \n\
+      var diag2 := intArray [N+N-1] of 0 \n\
+ \n\
+      function printboard() = ( \n\
+        for i := 0 to N-1 do ( \n\
+          for j := 0 to N-1 do print(if col[i]=j then \" O\" else \" .\"); \n\
+          print(\"\n\") \n\
+        ); \n\
+        print(\"\n\") \n\
+      ) \n\
+ \n\
+      function try(c:int) = ( \n\
+        /*  for i:= 0 to c do print(\".\"); print(\"\n\"); flush();*/ \n\
+        if c=N \n\
+        then printboard() \n\
+        else \n\
+          for r := 0 to N-1 \n\
+          do \n\
+            if row[r]=0 & diag1[r+c]=0 & diag2[r+7-c]=0 \n\
+            then ( \n\
+              row[r]       := 1; \n\
+              diag1[r+c]   := 1; \n\
+              diag2[r+7-c] := 1; \n\
+              col[c]       := r; \n\
+              try(c+1); \n\
+              row[r]       := 0; \n\
+              diag1[r+c]   := 0; \n\
+              diag2[r+7-c] := 0 \n\
+            ) \n\
+      ) \n\
+    in \n\
+      try(0) \n\
+    end \n\
+    "
+  in
+  (code, code, [])
+*)
+
+let test_cases_from_book =
+  [ test_case_from_book_01
+  ; test_case_from_book_02
+  ; test_case_from_book_03
+  ; test_case_from_book_04
+  ; test_case_from_book_09
+  (*; test_case_from_book_queens*)
+  ]
+
+let tests_micro_cases =
+  let open Tiger.Parser in
+  [ (
+      let code =
+        "nil"
+      in
+      let tokens =
+        [NIL]
+      in
+      (code, code, tokens)
+    )
+  ; (
+      let code =
+        "5"
+      in
+      let tokens =
+        [INT 5]
+      in
+      (code, code, tokens)
+    )
+  ; (
+      let code =
+        "-5"
+      in
+      let tokens =
+        [MINUS; INT 5]
+      in
+      (code, code, tokens)
+    )
+  ; (
+      let code =
+        "f()"
+      in
+      let tokens =
+        [ID "f"; LPAREN; RPAREN]
+      in
+      (code, code, tokens)
+    )
+  ; (
+      let code =
+        "f(\"a\", 3, foo)"
+      in
+      let tokens =
+        [ID "f"; LPAREN; STRING "a"; COMMA; INT 3; COMMA; ID "foo"; RPAREN]
+      in
+      (code, code, tokens)
+    )
+  ; (
+      let code =
+        "abc.i"
+      in
+      let tokens =
+        [ID "abc"; DOT; ID "i"]
+      in
+      (code, code, tokens)
+    )
+  ; (
+      let code =
+        "abc [5] of nil"
+      in
+      let tokens =
+        [ID "abc"; LBRACK; INT 5; RBRACK; OF; NIL]
+      in
+      (code, code, tokens)
+    )
+  ; (
+      let code =
+        "abc[0]"
+      in
+      let tokens =
+        [ID "abc"; LBRACK; INT 0; RBRACK]
+      in
+      (code, code, tokens)
+    )
+  ; (
+      let code =
+        "abc[0] := foo()"
+      in
+      let tokens =
+        [ID "abc"; LBRACK; INT 0; RBRACK; ASSIGN; ID "foo"; LPAREN; RPAREN]
+      in
+      (code, code, tokens)
+    )
   ]
 
+let tests =
+  test_cases_from_book @ tests_micro_cases
+
 let () =
+  let tokens_of_code code =
+    let lexbuf = Lexing.from_string code in
+    let rec tokens () =
+      let token = Tiger.Lexer.token lexbuf in
+      (* Avoiding fragile pattern-matching *)
+      if token = Tiger.Parser.EOF then [] else token :: tokens ()
+    in
+    tokens ()
+  in
+  let parsetree_of_code code =
+    let lb = Lexing.from_string code in
+    (match Tiger.Parser.program Tiger.Lexer.token lb with
+    | exception Parsing.Parse_error ->
+        let module L = Lexing in
+        let L.({lex_curr_p = {pos_lnum=l; pos_bol=b; pos_cnum=c; _}; _}) = lb in
+        let msg = sprintf "Syntax error around line: %d, column: %d" l (c - b) in
+        Error msg
+    | absyn ->
+        Ok (Tiger.Absyn.to_string absyn)
+    )
+  in
   let bar_sep = String.make 80 '-' in
   let bar_end = String.make 80 '=' in
+  let indent n = String.make (2 * n) ' ' in
+  let color_on_green = "\027[0;32m" in
+  let color_on_red   = "\027[1;31m" in
+  let color_off      = "\027[0m" in
   List.iteri tests ~f:(fun i (name, code, tokens_expected) ->
     let i = i + 1 in  (* Because iteri starts with 0 *)
-    let open Printf in
-    printf "%s\n Test %d : %S\n" bar_sep i name;
+    printf "%s\n%sTest %d : %S\n" bar_sep (indent 0) i name;
+
+    printf "%sLexing : " (indent 1);
     let tokens_emitted = tokens_of_code code in
     (try
       assert (tokens_emitted = tokens_expected);
-      print_endline " ---> OK";
+      printf "%sOK%s\n" color_on_green color_off;
     with Assert_failure _ ->
       let tokens_to_string tokens =
-        String.concat "; " (List.map ~f:Tiger.Parser.Token.to_string tokens)
+        String.concat "; " (List.map ~f:Tiger.Parser_token.to_string tokens)
       in
       printf
-        " ---> ERROR\n    Expected: %s\n    Emitted : %s\n\n"
+        "%sERROR%s\n%sExpected: %s\n%sEmitted : %s\n\n"
+        color_on_red
+        color_off
+        (indent 2)
         (tokens_to_string tokens_expected)
+        (indent 2)
         (tokens_to_string tokens_emitted)
     );
+
+    printf "%sParsing: " (indent 1);
+    (match parsetree_of_code code with
+    | Error errmsg -> printf "%sERROR:%s %s\n" color_on_red   color_off errmsg
+    | Ok parsetree -> printf "%sOK:%s %s\n"    color_on_green color_off parsetree
+    );
+
   );
   print_endline bar_end;
This page took 0.041614 seconds and 4 git commands to generate.