summaryrefslogtreecommitdiffstats
path: root/stdlib/obj.ml
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib/obj.ml')
-rw-r--r--stdlib/obj.ml2
1 files changed, 1 insertions, 1 deletions
diff --git a/stdlib/obj.ml b/stdlib/obj.ml
index 0d72f4033..f2a5858f0 100644
--- a/stdlib/obj.ml
+++ b/stdlib/obj.ml
@@ -28,7 +28,7 @@ external new_block : int -> int -> t = "obj_block"
external dup : t -> t = "obj_dup"
external truncate : t -> int -> unit = "obj_truncate"
-let marshal (obj: t) =
+let marshal (obj : t) =
Marshal.to_string obj []
let unmarshal str pos =
(Marshal.from_string str pos, pos + Marshal.total_size str pos)