Mothball SVN support
[hcoop/domtool2.git] / src / print.sml
CommitLineData
63920aa5
AC
1(* HCoop Domtool (http://hcoop.sourceforge.net/)
2 * Copyright (c) 2006, Adam Chlipala
3 *
4 * This program is free software; you can redistribute it and/or
5 * modify it under the terms of the GNU General Public License
6 * as published by the Free Software Foundation; either version 2
7 * of the License, or (at your option) any later version.
8 *
9 * This program is distributed in the hope that it will be useful,
10 * but WITHOUT ANY WARRANTY; without even the implied warranty of
11 * MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
12 * GNU General Public License for more details.
13 *
14 * You should have received a copy of the GNU General Public License
15 * along with this program; if not, write to the Free Software
16 * Foundation, Inc., 51 Franklin Street, Fifth Floor, Boston, MA 02110-1301, USA.
dac62e84 17 *)
63920aa5
AC
18
19(* Pretty-printing Domtool configuration file ASTs *)
20
21structure Print :> PRINT = struct
22
23open Ast
24
25structure SM = TextIOPP
26
27structure PD = PPDescFn(SM)
28open PD
29
30fun dBox ds = hovBox (PPS.Rel 1, ds)
31fun dvBox ds = vBox (PPS.Rel 0, ds)
32fun ivBox ds = vBox (PPS.Rel 1, ds)
33
34fun parenIf pn ds =
35 if pn then
36 dBox (string "(" :: ds @ [string ")"])
37 else
38 dBox ds
39
40fun p_pred' pn (p, _) =
41 case p of
42 CRoot => string "Root"
43 | CConst s => string s
44 | CPrefix p => dBox [string "^", p_pred' true p]
45 | CNot p => dBox [string "!", p_pred' true p]
46 | CAnd (p1, p2) =>
47 parenIf pn [p_pred' true p1, space 1, string "&", space 1, p_pred' true p2]
48
49val p_pred = p_pred' false
50
51fun p_predBoxed p = dBox [string "[", p_pred p, string "]"]
52
53fun p_typ' pn (t, _) =
54 case t of
55 TBase s => string s
56 | TList t => dBox [string "[", p_typ' false t, string "]"]
57 | TArrow (t1, t2) =>
58 parenIf pn [p_typ' true t1, space 1, string "->", space 1, p_typ' true t2]
59 | TAction (p, r1, r2) =>
60 parenIf pn [p_predBoxed p, space 1, p_record r1, space 1,
234b917a 61 string "=>", space 1, p_record r2]
1a4e5a6c
AC
62 | TNested (p, t) =>
63 parenIf pn [p_pred' false p, space 1, string "=>", space 1, p_typ' false t]
27d9de59
AC
64
65 | TError => string "<error>"
66 | TUnif (_, ref (SOME t)) => p_typ' pn t
67 | TUnif (name, ref NONE) => string ("<" ^ name ^ ">")
68
63920aa5
AC
69and p_record r =
70 case StringMap.foldri (fn (name, t, d) =>
71 SOME (case d of
72 NONE => dBox [string name, space 1,
73 string ":", space 1, p_typ t]
74 | SOME d => dBox [dBox [string name, space 1,
75 string ":", space 1, p_typ t],
76 string ",", space 1, d]))
77 NONE r of
78 NONE => string "{}"
79 | SOME d => dBox [string "{", d, string "}"]
80
81and p_typ t = p_typ' false t
82
83fun p_exp (e, _) =
84 case e of
85 EInt n => string (Int.toString n)
86 | EString s => string (String.concat ["\"", String.toString s, "\""])
87 | EList es =>
88 (case foldr (fn (e, d) =>
89 SOME (case d of
90 NONE => p_exp e
91 | SOME d => dBox [p_exp e, string ",", space 1, d]))
92 NONE es of
93 NONE => string "[]"
94 | SOME d => dBox [string "[", d, string "]"])
95
27d9de59
AC
96 | ELam (x, NONE, e) => dBox [string "(\\", space 1, string x, space 1,
97 string "->", space 1, p_exp e, string ")"]
98 | ELam (x, SOME t, e) => dBox [string "(\\", space 1, string x, space 1,
63920aa5
AC
99 string ":", space 1,
100 dBox [string "(", p_typ t, string ")"],
101 space 1, string "->", space 1, p_exp e, string ")"]
6bb366c5
AC
102 | EALam (x, c, e) => dBox [string "(\\\\", space 1, string x, space 1,
103 string ":", space 1, p_pred c,
104 space 1, string "->", space 1, p_exp e, string ")"]
27d9de59 105
63920aa5
AC
106 | EVar x => string x
107 | EApp (e1, e2) => dBox [string "(", p_exp e1, break {nsp = 1, offset = 0}, p_exp e2, string ")"]
108
234b917a 109 | ESkip => string "_"
63920aa5
AC
110 | ESet (x, e) => dBox [string x, space 1, string "=", space 1, p_exp e]
111 | EGet (x1, x2, e) => dBox [dBox [string x1, space 1, string "<-",
112 space 1, string x2, string ";", space 1],
113 p_exp e]
114 | ESeq es => dBox (valOf (foldr (fn (e, NONE) => SOME [p_exp e]
8a7c40fa 115 | (e, SOME ds) => SOME (dBox [p_exp e, string ";", newline] :: ds))
63920aa5 116 NONE es))
1a4e5a6c
AC
117 | ELocal (e1, e2) => dBox [string "let", space 1,
118 p_exp e1, space 1,
119 string "in", space 1,
120 p_exp e2, space 1,
121 string "end"]
234b917a
AC
122 | EWith (e1, (ESkip, _)) => dBox [p_exp e1, space 1, string "with", space 1, string "end"]
123 | EWith (e1, e2) => dBox [p_exp e1, space 1, string "with", p_exp e2, space 1, string "end"]
63920aa5 124
27d9de59 125fun printd d =
63920aa5
AC
126 let
127 val myStream = SM.openOut {dst = TextIO.stdOut,
128 wid = 80}
129 in
130 description (myStream, d);
131 SM.newline myStream;
132 SM.closeStream myStream
133 end
134
629a34f6
AC
135fun preface (s, d) = printd (PD.hovBox (PD.PPS.Rel 0,
136 [PD.string s, PD.space 1, d]))
137
63920aa5 138end