summaryrefslogtreecommitdiffstats
path: root/stdlib/map.mli
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib/map.mli')
-rw-r--r--stdlib/map.mli2
1 files changed, 1 insertions, 1 deletions
diff --git a/stdlib/map.mli b/stdlib/map.mli
index 99b2dd2db..eb624c8cd 100644
--- a/stdlib/map.mli
+++ b/stdlib/map.mli
@@ -66,6 +66,6 @@ module type S =
not specified. *)
end
-module Make(Ord: OrderedType): (S with key = Ord.t)
+module Make(Ord: OrderedType): (S with type key = Ord.t)
(* Functor building an implementation of the map structure
given a totally ordered type. *)