summaryrefslogtreecommitdiffstats
path: root/stdlib/printf.ml
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib/printf.ml')
-rw-r--r--stdlib/printf.ml8
1 files changed, 0 insertions, 8 deletions
diff --git a/stdlib/printf.ml b/stdlib/printf.ml
index b57ed3652..62841fe12 100644
--- a/stdlib/printf.ml
+++ b/stdlib/printf.ml
@@ -113,11 +113,6 @@ let extract_format fmt start stop widths =
Buffer.add_char b c; fill_format (succ i) w
in fill_format start (List.rev widths)
-let substitute_string f s =
- let b = Buffer.create (2 * String.length s) in
- Buffer.add_substitute b f s;
- Buffer.contents b;;
-
let format_int_with_conv conv fmt i =
match conv with
| 'b' -> format_binary_int fmt i
@@ -219,9 +214,6 @@ let scan_format fmt pos cont_s cont_a cont_t cont_f =
end
| '!' ->
Obj.magic (cont_f (succ i))
- | '$' ->
- Obj.magic (fun f s ->
- cont_s (substitute_string f s) (succ i))
| _ ->
bad_format fmt pos
in scan_flags [] (pos + 1)