@@ -71,15 +71,15 @@ S: sig
71
71
type tt/5 = local(SubstituteMe/2,false).t
72
72
type uu/4 = local(SubstituteMe/2,false).u
73
73
type vv/3 = local(SubstituteMe/2,false).v
74
- (removed=[])end
74
+ (removed=[])end (canonical=None)
75
75
76
76
AFTER
77
77
======
78
78
S: sig
79
79
type tt/6 = r(SubTargets/1).t
80
80
type uu/7 = r(SubTargets/1).u
81
81
type vv/8 = r(SubTargets/1).v
82
- (removed=[])end
82
+ (removed=[])end (canonical=None)
83
83
84
84
- : unit = ()
85
85
```
@@ -139,19 +139,19 @@ module SomeMonad/29 : sig
139
139
val map/35 : ([a] r(t/34)) -> ((a) -> b) -> [b] r(t/34)
140
140
val join/36 : ([[a] r(t/34)] r(t/34)) -> [a] r(t/34)
141
141
(removed=[]))
142
- (removed=[])end
142
+ (removed=[])end (canonical=None)
143
143
module ComplexTypeExpr/28 : sig
144
144
type t/37
145
145
include : r(Monad/30) with [r(root(Monad/30).t) = ([r(int) * a] r(t/37) * [a * r(int)] r(t/37))] (sig =
146
146
val map/38 : (([r(int) * a] r(t/37) * [a * r(int)] r(t/37))) -> ((a) -> b) -> ([r(int) * b] r(t/37) * [b * r(int)] r(t/37))
147
147
val join/39 : (([r(int) * ([r(int) * a] r(t/37) * [a * r(int)] r(t/37))] r(t/37) * [([r(int) * a] r(t/37) * [a * r(int)] r(t/37)) * r(int)] r(t/37))) -> ([r(int) * a] r(t/37) * [a * r(int)] r(t/37))
148
148
(removed=[]))
149
- (removed=[])end
149
+ (removed=[])end (canonical=None)
150
150
module Erase/27 : sig
151
151
include : r(Monad/30) with [r(root(Monad/30).t) = a] (sig = val map/40 : (a) -> ((a) -> b) -> b
152
152
val join/41 : (a) -> a
153
153
(removed=[]))
154
- (removed=[])end
154
+ (removed=[])end (canonical=None)
155
155
(removed=[])
156
156
```
157
157
@@ -185,7 +185,7 @@ module SwappedVars/53 : sig
185
185
val join/61 : ([e * [e * a] r(t/59)] r(t/59)) -> [e * a] r(t/59)
186
186
val both/62 : ([e * a] r(t/59)) -> ([e * b] r(t/59)) -> [e * (a * b)] r(t/59)
187
187
(removed=[]))
188
- (removed=[])end
188
+ (removed=[])end (canonical=None)
189
189
(removed=[])
190
190
```
191
191
@@ -213,6 +213,6 @@ module M/68 : sig
213
213
include : r(S/69) with [r(root(S/69).t) = [(alias (poly_var [ `A of (a * b) ]) b)] r(t/72)] (sig =
214
214
val map/73 : ([(alias (poly_var [ `A of (a * b) ]) b)] r(t/72)) -> ((a) -> b) -> [(alias (poly_var [ `A of (b * b) ]) b)] r(t/72)
215
215
(removed=[]))
216
- (removed=[])end
216
+ (removed=[])end (canonical=None)
217
217
(removed=[])
218
218
```
0 commit comments