-
Notifications
You must be signed in to change notification settings - Fork 85
/
Copy patheffect.ml
192 lines (154 loc) · 6.93 KB
/
effect.ml
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
37
38
39
40
41
42
43
44
45
46
47
48
49
50
51
52
53
54
55
56
57
58
59
60
61
62
63
64
65
66
67
68
69
70
71
72
73
74
75
76
77
78
79
80
81
82
83
84
85
86
87
88
89
90
91
92
93
94
95
96
97
98
99
100
101
102
103
104
105
106
107
108
109
110
111
112
113
114
115
116
117
118
119
120
121
122
123
124
125
126
127
128
129
130
131
132
133
134
135
136
137
138
139
140
141
142
143
144
145
146
147
148
149
150
151
152
153
154
155
156
157
158
159
160
161
162
163
164
165
166
167
168
169
170
171
172
173
174
175
176
177
178
179
180
181
182
183
184
185
186
187
188
189
190
191
192
(**************************************************************************)
(* *)
(* OCaml *)
(* *)
(* KC Sivaramakrishnan, Indian Institute of Technology, Madras *)
(* *)
(* Copyright 2021 Indian Institute of Technology, Madras *)
(* *)
(* All rights reserved. This file is distributed under the terms of *)
(* the GNU Lesser General Public License version 2.1, with the *)
(* special exception on linking described in the file LICENSE. *)
(* *)
(**************************************************************************)
type 'a t = ..
external perform : 'a t -> 'a = "%perform"
type exn += Unhandled: 'a t -> exn
exception Continuation_already_resumed
let () =
let printer = function
| Unhandled x ->
let msg = Printf.sprintf "Stdlib.Effect.Unhandled(%s)"
(Printexc.string_of_extension_constructor @@ Obj.repr x)
in
Some msg
| _ -> None
in
Printexc.Safe.register_printer printer
(* Register the exceptions so that the runtime can access it *)
type _ t += Should_not_see_this__ : unit t
let _ = Callback.Safe.register_exception "Effect.Unhandled"
(Unhandled Should_not_see_this__)
let _ = Callback.Safe.register_exception "Effect.Continuation_already_resumed"
Continuation_already_resumed
type (-'a, +'b) cont
(* A last_fiber is a tagged pointer, so does not keep the fiber alive.
It must never be the sole reference to the fiber, and is only used to cache
the final fiber in the linked list formed by [cont.fiber->parent]. *)
type last_fiber [@@immediate]
external cont_last_fiber : ('a, 'b) cont -> last_fiber = "%field1"
external cont_set_last_fiber :
('a, 'b) cont -> last_fiber -> unit = "%setfield1"
module Must_not_enter_gc = struct
(* Stacks are represented as tagged pointers, so do not keep the fiber alive.
We must not enter the GC between the creation and use of a [stack]. *)
type (-'a, +'b) stack [@@immediate]
external alloc_stack :
('a -> 'b) ->
(exn -> 'b) ->
('c t -> ('c, 'b) cont -> last_fiber -> 'b) ->
('a, 'b) stack = "caml_alloc_stack"
external runstack : ('a, 'b) stack -> ('c -> 'a) -> 'c -> 'b = "%runstack"
external take_cont_noexc : ('a, 'b) cont -> ('a, 'b) stack =
"caml_continuation_use_noexc" [@@noalloc]
external take_cont_and_update_handler_noexc :
('a,'b) cont ->
('b -> 'c) ->
(exn -> 'c) ->
('d t -> ('d,'b) cont -> last_fiber -> 'c) ->
('a,'c) stack = "caml_continuation_use_and_update_handler_noexc" [@@noalloc]
external resume : ('a, 'b) stack -> ('c -> 'a) -> 'c -> last_fiber -> 'b = "%resume"
(* Allocate a stack and immediately run [f x] using that stack.
We must not enter the GC between [alloc_stack] and [runstack].
[with_stack] is marked as [@inline never] to avoid reordering. *)
let[@inline never] with_stack valuec exnc effc f x =
runstack (alloc_stack valuec exnc effc) f x
(* Retrieve the stack from a [cont]inuation and run [f x] using it.
We must not enter the GC between [take_cont_noexc] and [resume].
[with_cont] is marked as [@inline never] to avoid reordering. *)
let[@inline never] with_cont cont f x =
resume (take_cont_noexc cont) f x (cont_last_fiber cont)
(* Retrieve the stack from a [cont]inuation, update its handlers, and run [f x] using it.
We must not enter the GC between [take_cont_and_update_handler_noexc] and [resume].
[with_cont] is marked as [@inline never] to avoid reordering. *)
let[@inline never] with_handler cont valuec exnc effc f x =
resume (take_cont_and_update_handler_noexc cont valuec exnc effc) f x (cont_last_fiber cont)
end
module Deep = struct
type ('a,'b) continuation = ('a,'b) cont
let continue k v = Must_not_enter_gc.with_cont k (fun x-> x) v
let discontinue k e = Must_not_enter_gc.with_cont k (fun e -> raise e) e
let discontinue_with_backtrace k e bt =
Must_not_enter_gc.with_cont k (fun e -> Printexc.raise_with_backtrace e bt) e
type ('a,'b) handler =
{ retc: 'a -> 'b;
exnc: exn -> 'b;
effc: 'c.'c t -> (('c,'b) continuation -> 'b) option }
external reperform :
'a t -> ('a, 'b) continuation -> last_fiber -> 'b = "%reperform"
let match_with comp arg handler =
let effc eff k last_fiber =
match handler.effc eff with
| Some f ->
cont_set_last_fiber k last_fiber;
f k
| None -> reperform eff k last_fiber
in
Must_not_enter_gc.with_stack handler.retc handler.exnc effc comp arg
type 'a effect_handler =
{ effc: 'b. 'b t -> (('b,'a) continuation -> 'a) option }
let try_with comp arg handler =
let effc' eff k last_fiber =
match handler.effc eff with
| Some f ->
cont_set_last_fiber k last_fiber;
f k
| None -> reperform eff k last_fiber
in
Must_not_enter_gc.with_stack (fun x -> x) (fun e -> raise e) effc' comp arg
external get_callstack :
('a,'b) continuation -> int -> Printexc.raw_backtrace =
"caml_get_continuation_callstack"
end
module Shallow = struct
type ('a,'b) continuation = ('a,'b) cont
let fiber : type a b. (a -> b) -> (a, b) continuation = fun f ->
let module M = struct type _ t += Initial_setup__ : a t end in
let exception E of (a,b) continuation in
let f' () = f (perform M.Initial_setup__) in
let error _ = failwith "impossible" in
let effc eff k last_fiber =
match eff with
| M.Initial_setup__ ->
cont_set_last_fiber k last_fiber;
raise_notrace (E k)
| _ -> error ()
in
match Must_not_enter_gc.with_stack error error effc f' () with
| exception E k -> k
| _ -> error ()
type ('a,'b) handler =
{ retc: 'a -> 'b;
exnc: exn -> 'b;
effc: 'c.'c t -> (('c,'a) continuation -> 'b) option }
external reperform :
'a t -> ('a, 'b) continuation -> last_fiber -> 'c = "%reperform"
let continue_gen k resume_fun v handler =
let effc eff k last_fiber =
match handler.effc eff with
| Some f ->
cont_set_last_fiber k last_fiber;
f k
| None -> reperform eff k last_fiber
in
Must_not_enter_gc.with_handler k handler.retc handler.exnc effc resume_fun v
let continue_with k v handler =
continue_gen k (fun x -> x) v handler
let discontinue_with k v handler =
continue_gen k (fun e -> raise e) v handler
let discontinue_with_backtrace k v bt handler =
continue_gen k (fun e -> Printexc.raise_with_backtrace e bt) v handler
external get_callstack :
('a,'b) continuation -> int -> Printexc.raw_backtrace =
"caml_get_continuation_callstack"
end