@@ -144,49 +144,48 @@ module Type : sig
144144
145145 ['env] is a custom value threaded through the path. Parent nodes can use
146146 this to give child nodes context *)
147- class virtual ['env, 'm ] mapreduce :
148- object ('self )
149- method virtual empty : 'm
147+ class virtual ['env, 'm ] mapreduce : object ('self )
148+ method virtual empty : 'm
150149
151- method virtual plus : 'm -> 'm -> 'm
150+ method virtual plus : 'm -> 'm -> 'm
152151
153- (* * doesn't really to be here, but putting it here avoids passing [empty]
154- and [plus] to a general purpose [fold_left_map]*)
155- method private fold_left_map :
156- 'a . f :('a -> 'a * 'm ) -> 'a list -> 'a list * 'm
152+ (* * doesn't really to be here, but putting it here avoids passing [empty]
153+ and [plus] to a general purpose [fold_left_map]*)
154+ method private fold_left_map :
155+ 'a . f :('a -> 'a * 'm ) -> 'a list -> 'a list * 'm
157156
158- method alias : 'env -> t -> decl * 'm
157+ method alias : 'env -> t -> decl * 'm
159158
160- method app : 'env -> t -> t list -> t * 'm
159+ method app : 'env -> t -> t list -> t * 'm
161160
162- method assoc : 'env -> t -> t -> t * 'm
161+ method assoc : 'env -> t -> t -> t * 'm
163162
164- method constr : 'env -> constr -> constr * 'm
163+ method constr : 'env -> constr -> constr * 'm
165164
166- method field : 'env -> field -> field * 'm
165+ method field : 'env -> field -> field * 'm
167166
168- method list : 'env -> t -> t * 'm
167+ method list : 'env -> t -> t * 'm
169168
170- method path : 'env -> Path. t -> t * 'm
169+ method path : 'env -> Path. t -> t * 'm
171170
172- method optional : 'env -> t -> t * 'm
171+ method optional : 'env -> t -> t * 'm
173172
174- method poly_variant : 'env -> constr list -> t * 'm
173+ method poly_variant : 'env -> constr list -> t * 'm
175174
176- method prim : 'env -> prim -> t * 'm
175+ method prim : 'env -> prim -> t * 'm
177176
178- method record : 'env -> field list -> decl * 'm
177+ method record : 'env -> field list -> decl * 'm
179178
180- method t : 'env -> t -> t * 'm
179+ method t : 'env -> t -> t * 'm
181180
182- method decl : 'env -> decl -> decl * 'm
181+ method decl : 'env -> decl -> decl * 'm
183182
184- method tuple : 'env -> t list -> t * 'm
183+ method tuple : 'env -> t list -> t * 'm
185184
186- method var : 'env -> string -> t * 'm
185+ method var : 'env -> string -> t * 'm
187186
188- method variant : 'env -> constr list -> decl * 'm
189- end
187+ method variant : 'env -> constr list -> decl * 'm
188+ end
190189end
191190
192191module Expr : sig
0 commit comments