Skip to content

Commit d24e45a

Browse files
committed
1 parent 9e80790 commit d24e45a

File tree

5 files changed

+17
-13
lines changed

5 files changed

+17
-13
lines changed

test-suite/output/NotationsCoercionsString.v

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -12,7 +12,7 @@ Inductive expr :=
1212
| Lam : string -> expr -> expr
1313
| App : expr -> expr -> expr.
1414

15-
Notation Let x e1 e2 := (App (Lam x e2) e1).
15+
Abbreviation Let x e1 e2 := (App (Lam x e2) e1).
1616
Parameter e1 e2 : expr.
1717
Check (Let "x" e1 e2). (* always printed the same *)
1818
Coercion App : expr >-> Funclass.

test-suite/output/StringSyntax.v

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -54,7 +54,7 @@ Compute List.map Ascii.ascii_of_nat (ListDef.seq 0 256).
5454
(* Test numeral notations for parameterized inductives *)
5555
Module Test2.
5656

57-
Notation string := (list Byte.byte).
57+
Abbreviation string := (list Byte.byte).
5858
Definition id_string := @id string.
5959

6060
String Notation string id_string id_string : list_scope.
@@ -99,12 +99,12 @@ End Test3.
9999
(* Test overlapping string notations *)
100100
Module Test4.
101101

102-
Notation string1 := (list Byte.byte).
102+
Abbreviation string1 := (list Byte.byte).
103103
Definition id_string1 := @id string1.
104104

105105
String Notation string1 id_string1 id_string1 : list_scope.
106106

107-
Notation string2 := (list Ascii.ascii).
107+
Abbreviation string2 := (list Ascii.ascii).
108108
Definition a2b := List.map byte_of_ascii.
109109
Definition b2a := List.map ascii_of_byte.
110110

test-suite/output/simpl.v

Lines changed: 8 additions & 8 deletions
Original file line numberDiff line numberDiff line change
@@ -44,7 +44,7 @@ Check "** NonPrimitiveProjection".
4444
Module DirectTuple.
4545
Check "DirectTuple (NonPrimitiveProjection)".
4646
Record T := {p:nat}.
47-
Notation TUPLE := {|p:=0|}.
47+
Abbreviation TUPLE := {|p:=0|}.
4848
Eval simpl in TUPLE.(p). (* -> 0 *)
4949
Eval cbn in TUPLE.(p). (* -> 0 *)
5050
Eval hnf in TUPLE.(p). (* -> 0 *)
@@ -76,7 +76,7 @@ End NamedTuple.
7676
Module DirectCoFix.
7777
Check "DirectCoFix (NonPrimitiveProjection)".
7878
CoInductive U := {p:U}.
79-
Notation COFIX := (cofix a := {|p:=a|}).
79+
Abbreviation COFIX := (cofix a := {|p:=a|}).
8080
Eval simpl in COFIX.(p). (* -> COFIX *)
8181
Eval cbn in COFIX.(p). (* -> COFIX *)
8282
Eval hnf in COFIX.(p). (* -> COFIX *)
@@ -112,7 +112,7 @@ Set Primitive Projections.
112112
Module DirectTuple.
113113
Check "DirectTuple (PrimitiveProjectionFolded)".
114114
Record T := {p:nat}.
115-
Notation TUPLE := {|p:=0|}.
115+
Abbreviation TUPLE := {|p:=0|}.
116116
Eval simpl in TUPLE.(p). (* -> 0 *)
117117
Eval cbn in TUPLE.(p). (* -> 0 *)
118118
Eval hnf in TUPLE.(p). (* -> 0 *)
@@ -143,7 +143,7 @@ End NamedTuple.
143143
Module DirectCoFix.
144144
Check "DirectCoFix (PrimitiveProjectionFolded)".
145145
CoInductive U := {p:U}.
146-
Notation COFIX := (cofix a := {|p:=a|}).
146+
Abbreviation COFIX := (cofix a := {|p:=a|}).
147147
Eval simpl in COFIX.(p). (* -> COFIX *)
148148
Eval cbn in COFIX.(p). (* -> COFIX *)
149149
Eval hnf in COFIX.(p). (* -> COFIX *)
@@ -214,7 +214,7 @@ Module DirectCoFix.
214214
Check "DirectCoFix (PrimitiveProjectionUnfolded)".
215215
CoInductive U := {q:U}.
216216
CoFixpoint a := {|q:=a|}.
217-
Notation COFIX := (cofix a := {|q:=a|}).
217+
Abbreviation COFIX := (cofix a := {|q:=a|}).
218218
Axiom P : U -> Prop.
219219
Goal P a.(q). unfold q. cbv delta [a]. simpl. Show. Abort. (* -> COFIX *)
220220
Goal P a.(q). unfold q. cbv delta [a]. cbn. Show. Abort. (* -> COFIX *)
@@ -229,7 +229,7 @@ Module NamedCoFix.
229229
Check "NamedCoFix (PrimitiveProjectionUnfolded)".
230230
CoInductive U := {q:U}.
231231
CoFixpoint a := {|q:=a|}.
232-
Notation COFIX := (cofix a := {|q:=a|}).
232+
Abbreviation COFIX := (cofix a := {|q:=a|}).
233233
Axiom P : U -> Prop.
234234
Goal P a.(q). unfold q. simpl. Show. Abort. (* -> a *)
235235
Goal P a.(q). unfold q. cbn. Show. Abort. (* -> a *)
@@ -254,7 +254,7 @@ Set Primitive Projections.
254254
Module DirectTuple.
255255
Check "DirectTuple (PrimitiveProjectionConstant)".
256256
Record T := {p:nat}.
257-
Notation TUPLE := {|p:=0|}.
257+
Abbreviation TUPLE := {|p:=0|}.
258258
Definition a := {|p:=0|}.
259259
Axiom P : nat -> Prop.
260260
Goal P (id p a). unfold id. cbv delta [a]. simpl. Show. Abort. (* -> 0 *)
@@ -288,7 +288,7 @@ End NamedTuple.
288288
Module DirectCoFix.
289289
Check "DirectCoFix (PrimitiveProjectionConstant)".
290290
CoInductive U := {q:U}.
291-
Notation COFIX := (cofix a := {|q:=a|}).
291+
Abbreviation COFIX := (cofix a := {|q:=a|}).
292292
Axiom P : U -> Prop.
293293
Goal P (id q COFIX). unfold id. simpl. Show. Abort. (* -> COFIX *)
294294
Goal P (id q COFIX). unfold id. cbn. Show. Abort. (* -> COFIX *)

theories/_CoqProject

Lines changed: 3 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1 +1,4 @@
11
-R . Stdlib
2+
# to handle when requiring Rocq >= 9.2
3+
-arg -w -arg -notation-for-abbreviation
4+
-arg -w -arg -ltac2-notation-for-abbreviation

theories/dune

Lines changed: 2 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -6,7 +6,8 @@
66
(env
77
(dev
88
(coq
9-
(flags :standard))))
9+
;; see theories/_CoqProject for details
10+
(flags :standard -w -notation-for-abbreviation -w -ltac2-notation-for-abbreviation))))
1011

1112
(rule
1213
(targets All.v)

0 commit comments

Comments
 (0)