Lines Matching refs:store

27 let process_connection_fds store cons domains rset wset =
30 fct store cons domains c
54 let process_domains store cons domains =
62 Process.do_input store cons domains con;
63 Process.do_output store cons domains con;
68 let sigusr1_handler store =
72 finally (fun () -> Store.dump store channel)
162 | "store" :: path :: perms :: value :: [] ->
177 let from_channel store cons doms chan =
179 let op = Store.get_ops store Perms.Connection.full_rights in
202 let from_file store cons doms file =
204 finally (fun () -> from_channel store doms cons channel)
207 let to_channel store cons chan =
215 (* dump the store *)
216 Store.dump_fct store (fun path node ->
220 fprintf chan "store,%s,%s,%s\n" (hexify fullpath) (hexify permstr) (hexify value)
226 let to_file store cons file =
228 finally (fun () -> to_channel store cons channel)
268 let store = Store.create () in var
295 DB.from_file store domains cons filename;
299 info "reading store from disk";
300 Disk.read store
304 if not (Store.path_exists store localpath) then
305 Store.mkdir store (Perms.Connection.create 0) localpath;
317 Sys.set_signal Sys.sigusr1 (Sys.Signal_handle (fun i -> sigusr1_handler store));
321 let post_rotate () = DB.to_file store cons (Paths.xen_run_stored ^ "/db") in
367 Process.do_output store cons domains con;
368 Process.do_input store cons domains con;
392 Store.mark_symbols store;
413 let store_nodes, store_abort, store_coalesce = Store.stats store in
416 info "store stat: nodes(%d) t-abort(%d) t-coalesce(%d)"
469 process_connection_fds store cons domains cfds wset;
476 process_domains store cons domains
490 DB.to_file store cons (Paths.xen_run_stored ^ "/db");