text
stringlengths
0
601k
let uncast_opt = function | Some h -> Some ( Pct . uncast_decoded h ) | None -> None
let cast_opt = function | Some h -> Some ( Pct . cast_decoded h ) | None -> None
let normalize schem uri = let module Scheme = ( val ( module_of_scheme ( uncast_opt schem ) ) : Scheme ) in let dob f = function | Some x -> Some ( Pct . unlift_decoded f x ) | None -> None in { uri with scheme = dob String . lowercase_ascii uri . scheme ; host = cast_opt ( Scheme . normalize_host ( uncast_opt uri . host ) ) }
let make ? scheme ? userinfo ? host ? port ? path ? query ? fragment ( ) = let decode = function | Some x -> Some ( Pct . cast_decoded x ) | None -> None in let host = match userinfo , host , port with | _ , Some _ , _ | None , None , None -> host | Some _ , None , _ | _ , None , Some _ -> Some " " in let userinfo = match userinfo with | None -> None | Some u -> Some ( userinfo_of_encoded u ) in let path = match path with | None -> [ ] | Some p -> let path = path_of_encoded p in match host , path with | None , _ | Some _ , " " /:: _ | Some _ , [ ] -> path | Some _ , _ -> " " /:: path in let query = match query with | None -> Query . KV [ ] | Some p -> Query . KV p in let scheme = decode scheme in normalize scheme { scheme ; userinfo ; host = decode host ; port ; path ; query ; fragment = decode fragment }
let to_string ( ? pct_encoder = pct_encoder ( ) ) uri = let scheme = match uri . scheme with | Some s -> Some ( Pct . uncast_decoded s ) | None -> None in let buf = Buffer . create 128 in let add_pct_string ( ? component ` = Path ) x = Buffer . add_string buf ( Pct . uncast_encoded ( Pct . encode ? scheme ~ component x ) ) in ( match uri . scheme with | None -> ( ) | Some x -> add_pct_string ~ component : pct_encoder . scheme x ; Buffer . add_char buf ' ' : ) ; if ( match uri . userinfo , uri . host , uri . port with | Some _ , _ , _ | _ , Some _ , _ | _ , _ , Some _ -> true | _ -> false ) then Buffer . add_string buf " " ; // ( match uri . userinfo with | None -> ( ) | Some userinfo -> Buffer . add_string buf ( Pct . uncast_encoded ( encoded_of_userinfo ? scheme ~ component : pct_encoder . userinfo userinfo ) ) ; Buffer . add_char buf ' ' @ ) ; ( match uri . host with | None -> ( ) | Some host -> add_pct_string ~ component : pct_encoder . host host ; ) ; ( match uri . port with | None -> ( ) | Some port -> Buffer . add_char buf ' ' ; : Buffer . add_string buf ( string_of_int port ) ) ; ( match uri . path with | [ ] -> ( ) | " " /:: _ -> Buffer . add_string buf ( Pct . uncast_encoded ( encoded_of_path ? scheme ~ component : pct_encoder . path uri . path ) ) | first_segment :: _ -> ( match uri . host with | Some _ -> Buffer . add_char buf ' ' / | None -> match Stringext . find_from first_segment ~ pattern " " :: with | None -> ( ) | Some _ -> match scheme with | Some _ -> ( ) | None -> Buffer . add_string buf " . " / ) ; Buffer . add_string buf ( Pct . uncast_encoded ( encoded_of_path ? scheme ~ component : pct_encoder . path uri . path ) ) ) ; Query . ( match uri . query with | Raw ( None , _ ) | KV [ ] -> ( ) | Raw ( _ , lazy q ) | KV q -> Buffer . add_char buf ' ' ; ? Buffer . add_string buf ( encoded_of_query ? scheme ~ pct_encoder q ) ) ; ( match uri . fragment with | None -> ( ) | Some f -> Buffer . add_char buf ' ' ; # add_pct_string ~ component : pct_encoder . fragment f ) ; Buffer . contents buf
let get_decoded_opt = function None -> None | Some x -> Some ( Pct . uncast_decoded x )
let scheme uri = get_decoded_opt uri . scheme
let with_scheme uri = function | Some scheme -> { uri with scheme = Some ( Pct . cast_decoded scheme ) } | None -> { uri with scheme = None }
let host uri = get_decoded_opt uri . host
let with_host uri = function | Some host -> { uri with host = Some ( Pct . cast_decoded host ) } | None -> { uri with host = None }
let host_with_default ( ? default " = localhost " ) uri = match host uri with | None -> default | Some h -> h
let userinfo ( ? pct_encoder = pct_encoder ( ) ) uri = match uri . userinfo with | None -> None | Some userinfo -> Some ( Pct . uncast_encoded ( match uri . scheme with | None -> encoded_of_userinfo ~ component : pct_encoder . userinfo userinfo | Some s -> encoded_of_userinfo ~ scheme ( : Pct . uncast_decoded s ) ~ component : pct_encoder . userinfo userinfo ) )
let with_userinfo uri userinfo = let userinfo = match userinfo with | Some u -> Some ( userinfo_of_encoded u ) | None -> None in match host uri with | None -> { uri with host = Some ( Pct . cast_decoded " " ) ; userinfo = userinfo } | Some _ -> { uri with userinfo = userinfo }
let user uri = match uri . userinfo with | None -> None | Some ( user , _ ) -> Some user
let password uri = match uri . userinfo with | None | Some ( _ , None ) -> None | Some ( _ , Some pass ) -> Some pass
let with_password uri password = let result userinfo = match host uri with | None -> { uri with host = Some ( Pct . cast_decoded " " ) ; userinfo = userinfo } | Some _ -> { uri with userinfo = userinfo } in match uri . userinfo , password with | None , None -> uri | None , Some _ -> result ( Some ( " " , password ) ) | Some ( user , _ ) , _ -> result ( Some ( user , password ) )
let port uri = uri . port
let with_port uri port = match host uri with | Some _ -> { uri with port = port } | None -> begin match port with | None -> { uri with host = None ; port = None } | Some _ -> { uri with host = Some ( Pct . cast_decoded " " ) ; port = port } end
let path ( ? pct_encoder = pct_encoder ( ) ) uri = Pct . uncast_encoded ( match uri . scheme with | None -> encoded_of_path ~ component : pct_encoder . path uri . path | Some s -> encoded_of_path ~ scheme ( : Pct . uncast_decoded s ) ~ component : pct_encoder . path uri . path )
let with_path uri path = let path = path_of_encoded path in match host uri , path with | None , _ | Some _ , " " /:: _ | Some _ , [ ] -> { uri with path = path } | Some _ , _ -> { uri with path " " =/:: path }
let fragment uri = get_decoded_opt uri . fragment
let with_fragment uri = function | None -> { uri with fragment = None } | Some frag -> { uri with fragment = Some ( Pct . cast_decoded frag ) }
let query uri = Query . kv uri . query
let verbatim_query ( ? pct_encoder = pct_encoder ( ) ) uri = Query . ( match uri . query with | Raw ( qs , _ ) -> qs | KV [ ] -> None | KV kv -> Some ( encoded_of_query ? scheme ( : scheme uri ) ~ pct_encoder kv ) )
let get_query_param ' uri k = Query . ( find ( kv uri . query ) k )
let get_query_param uri k = match get_query_param ' uri k with | None -> None | Some v -> Some ( String . concat " , " v )
let with_query uri query = { uri with query = Query . KV query }
let q_s q = List . map ( fun ( k , v ) -> k , [ v ] ) q
let with_query ' uri query = with_query uri ( q_s query )
let add_query_param uri p = Query . ( { uri with query = KV ( p ( :: kv uri . query ) ) } )
let add_query_param ' uri ( k , v ) = Query . ( { uri with query = KV ( ( k , [ v ] ) ( :: kv uri . query ) ) } )
let add_query_params uri ps = Query . ( { uri with query = KV ( ps ( @ kv uri . query ) ) } )
let add_query_params ' uri ps = Query . ( { uri with query = KV ( ( q_s ps ) ( @ kv uri . query ) ) } )
let remove_query_param uri k = Query . ( { uri with query = KV ( List . filter ( fun ( k ' , _ ) -> k <> k ' ) ( kv uri . query ) ) } )
let with_uri ? scheme ? userinfo ? host ? port ? path ? query ? fragment uri = let with_path_opt u o = match o with | None -> with_path u " " | Some p -> with_path u p in let with_query_opt u o = match o with | None -> with_query u [ ] | Some q -> with_query u q in let with_ f o u = match o with | None -> u | Some x -> f u x in with_ with_scheme scheme uri |> with_ with_userinfo userinfo |> with_ with_host host |> with_ with_port port |> with_ with_path_opt path |> with_ with_query_opt query |> with_ with_fragment fragment
let path_and_query uri = match ( path uri ) , ( query uri ) with " " , | [ ] -> " " / " " , | q -> let scheme = uncast_opt uri . scheme in Printf . sprintf " /?% s " ( encoded_of_query ? scheme q ) | p , [ ] -> p | p , q -> let scheme = uncast_opt uri . scheme in Printf . sprintf " % s ?% s " p ( encoded_of_query ? scheme q )
let resolve schem base uri = let schem = Some ( Pct . cast_decoded ( match scheme base with | None -> schem | Some scheme -> scheme ) ) in normalize schem Path . ( match scheme uri , userinfo uri , host uri with | Some _ , _ , _ -> { uri with path = remove_dot_segments uri . path } | None , Some _ , _ | None , _ , Some _ -> { uri with scheme = base . scheme ; path = remove_dot_segments uri . path } | None , None , None -> let uri = { uri with scheme = base . scheme ; userinfo = base . userinfo ; host = base . host ; port = base . port } in let path_str = path uri in if path_str " " = then { uri with path = base . path ; query = match uri . query with | Query . Raw ( None , _ ) | Query . KV [ ] -> base . query | _ -> uri . query } else if path_str . [ 0 ] ' ' =/ then { uri with path = remove_dot_segments uri . path } else { uri with path = remove_dot_segments ( merge base . host base . path uri . path ) ; } )
let canonicalize uri = let uri = resolve " " empty uri in let module Scheme = ( val ( module_of_scheme ( uncast_opt uri . scheme ) ) : Scheme ) in { uri with port = Scheme . canonicalize_port uri . port ; path = Scheme . canonicalize_path uri . path ; }
let pp ppf uri = Format . pp_print_string ppf ( to_string uri )
let pp_hum ppf uri = Format . pp_print_string ppf ( to_string uri )
module Parser = struct open Angstrom let string_of_char = String . make 1 let string_of_char_list chars = String . concat " " ( List . map string_of_char chars ) let scheme = lift ( fun s -> Some ( Pct . decode ( Pct . cast_encoded s ) ) ) ( take_while ( fun c -> c <> ' ' : && c <> ' ' / && c <> ' ' ? && c <> ' ' ) # <* char ' ' ) : <|> return None let is_digit = function ' 0 ' . . ' 9 ' -> true | _ -> false let hex_digit = satisfy ( function | ' 0 ' . . ' 9 ' | ' A ' . . ' F ' | ' a ' . . ' f ' -> true | _ -> false ) let hexadecimal = lift string_of_char_list ( many hex_digit ) let c_dot = char ' . ' let c_at = char ' ' @ let c_colon = char ' ' : let dec_octet = take_while1 ( function ' 0 ' . . ' 9 ' -> true | _ -> false ) >>= fun num -> if int_of_string num < 256 then return num else fail " invalid octect " let ipv4_address = lift2 ( fun three one -> String . concat " . " three ^ " . " ^ one ) ( count 3 ( dec_octet <* c_dot ) ) dec_octet let after_double_colon = fix ( fun f -> list [ ipv4_address ] <|> lift2 ( fun x y -> x :: y ) hexadecimal ( c_colon *> f <|> return [ ] ) ) let double_colon count = after_double_colon >>= ( fun rest -> let filler_length = 8 - count - List . length rest in if filler_length <= 0 then fail " too many parts in IPv6 address " else return ( " " :: rest ) ) <|> return [ " " ] let rec part = function | 7 -> lift ( fun x -> [ x ] ) hexadecimal | 6 -> list [ ipv4_address ] <|> hex_part 6 | n -> hex_part n and hex_part n = lift2 ( fun x y -> x :: y ) hexadecimal ( c_colon *> ( c_colon *> double_colon ( n + 1 ) <|> part ( n + 1 ) ) ) let rec split_with f xs = match xs with | [ ] -> [ ] , [ ] | y :: ys -> if f y then let zs , ts = split_with f ys in y :: zs , ts else [ ] , xs let ipv6 = let format_addr segments = let before_double_colon , after_double_colon = split_with ( fun segment -> segment <> " " ) segments in let before = String . concat " " : before_double_colon in let res = match after_double_colon with | " " :: xs -> before ^ " " :: ^ String . concat " " : xs | _ -> before in res in lift format_addr ( c_colon *> c_colon *> double_colon 0 <|> part 0 ) let ipv6_address = lift3 ( fun lb ip rb -> String . concat " " [ string_of_char lb ; ip ; string_of_char rb ] ) ( char ' [ ' ) ipv6 ( char ' ] ' ) let pct_encoded = lift2 ( fun pct digits -> string_of_char_list ( pct :: digits ) ) ( char ' ' ) % ( count 2 hex_digit ) let sub_delims = satisfy ( function | ' ' ! | ' ' $ | ' ' & | ' ' ' \ | ' ( ' | ' ) ' | ' ' * | ' ' + | ' , ' | ' ; ' | ' ' = -> true | _ -> false ) let unreserved = satisfy ( function | ' A ' . . ' Z ' | ' a ' . . ' z ' | ' 0 ' . . ' 9 ' | ' ' - | ' . ' | ' _ ' | ' ' ~ -> true | _ -> false ) let reg_name = lift ( String . concat " " ) ( many ( choice [ string_of_char <$> unreserved ; pct_encoded ; string_of_char <$> sub_delims ] ) ) let host = lift ( fun s -> Pct . decode ( Pct . cast_encoded s ) ) ( choice [ reg_name ; ipv4_address ; ipv6_address ] ) let userinfo = lift ( fun x -> let s = String . concat " " x in Some ( Userinfo . userinfo_of_encoded s ) ) ( many ( choice [ string_of_char <$> unreserved ; pct_encoded ; string_of_char <$> sub_delims ; string_of_char <$> c_colon ] ) <* c_at ) <|> return None let port = peek_char >>= function | Some ' ' : -> c_colon *> take_while is_digit >>| fun port -> let decoded = Pct . decode ( Pct . cast_encoded port ) in ( try Some ( int_of_string ( Pct . uncast_decoded decoded ) ) with _ -> None ) | Some _ | None -> return None let authority = string " " // *> lift3 ( fun userinfo host port -> userinfo , Some host , port ) userinfo host port <|> return ( None , None , None ) let path = lift Path . path_of_encoded ( take_while ( function ' ' ? | ' ' # -> false | _ -> true ) ) let query = lift Query . of_raw ( char ' ' ? *> take_till ( function ' ' # -> true | _ -> false ) ) <|> return ( Query . Raw ( None , Lazy . from_val [ ] ) ) let fragment = lift ( fun s -> Some ( Pct . decode ( Pct . cast_encoded s ) ) ) ( char ' ' # *> take_while ( fun _ -> true ) ) <|> return None let _uri_reference = lift4 ( fun scheme ( userinfo , host , port ) path query fragment -> normalize scheme { scheme ; userinfo ; host ; port ; path ; query ; fragment } ) scheme authority path query <*> fragment let uri_reference = take_while ( function | ' \ n ' -> false | _ -> true ) >>| fun s -> match Angstrom . parse_string ~ consume : All _uri_reference s with | Ok t -> t | Error _ -> empty end
let of_string s = match Angstrom . parse_string ~ consume : Prefix Parser . uri_reference s with | Ok t -> t | Error _ -> empty
type t = string [ @@ deriving_inline yojson ]
let _ = fun ( _ : t ) -> ( )
let t_of_yojson = ( string_of_yojson : Ppx_yojson_conv_lib . Yojson . Safe . t -> t )
let yojson_of_t = ( yojson_of_string : t -> Ppx_yojson_conv_lib . Yojson . Safe . t )
let _ = yojson_of_t [ @@@ end ]
let to_string uri = uri
let proto = match Sys . win32 with | true -> " file " :/// | false -> " file " ://
let to_path ( uri : t ) = let path = match String . drop_prefix ~ prefix : proto uri with | Some path -> path | None -> uri in path |> String . replace_all ~ pattern " " :\\ ~ with_ " " :/ |> String . replace_all ~ pattern " :% 3A " ~ with_ " " :: |> String . replace_all ~ pattern " :% 5C " ~ with_ " " :/
let of_path ( path : string ) = let path = path |> String . replace_all ~ pattern " " :\\ ~ with_ " " :/ |> String . replace_all ~ pattern " " :: ~ with_ " :% 3A " in proto ^ path
let pp fmt uri = Format . fprintf fmt " % s " uri
module Private = struct module Heap = Heap end
module type FLAGS = sig type t = private int val of_int : int -> t val ( + ) : t -> t -> t val mem : t -> t -> bool end
module Flags = struct type t = int let empty = 0 let of_int x = x let ( + ) = ( lor ) let mem a b = ( a land b ) = a end
module Open_flags = struct include Flags let rdonly = Config . o_rdonly let wronly = Config . o_wronly let rdwr = Config . o_rdwr let creat = Config . o_creat let excl = Config . o_excl let noctty = Config . o_noctty let trunc = Config . o_trunc let append = Config . o_append let nonblock = Config . o_nonblock let dsync = Config . o_dsync let direct = Config . o_direct let largefile = Config . o_largefile let directory = Config . o_directory let nofollow = Config . o_nofollow let noatime = Config . o_noatime let cloexec = Config . o_cloexec let sync = Config . o_sync let path = Config . o_path let tmpfile = Config . o_tmpfile end
module Resolve = struct include Flags let no_xdev = 0x01 let no_magiclinks = 0x02 let no_symlinks = 0x04 let beneath = 0x08 let in_root = 0x10 let cached = 0x20 end
module Poll_mask = struct include Flags let pollin = Config . pollin let pollout = Config . pollout let pollerr = Config . pollerr let pollhup = Config . pollhup end
module Sockaddr = struct type t external of_unix : Unix . sockaddr -> t = " ocaml_uring_make_sockaddr " external get : t -> Unix . sockaddr = " ocaml_uring_extract_sockaddr " let dummy_addr = Unix . ADDR_UNIX " " - let create ( ) = of_unix dummy_addr end
module Open_how = struct type t external make : int -> Unix . file_perm -> int -> string -> t = " ocaml_uring_make_open_how " let v ~ open_flags ~ perm ~ resolve path = make open_flags perm resolve path end
module Iovec = struct module Check : sig [ @@@ warning " - 34 " ] type t = private { buffer : ( char , Bigarray . int8_unsigned_elt , Bigarray . c_layout ) Bigarray . Array1 . t ; off : int ; len : int ; } end = Cstruct type iovec type t = iovec * int * Cstruct . t list external make_iovec : Cstruct . t list -> int -> iovec = " ocaml_uring_make_iovec " let make buffers = let len = List . length buffers in let iovec = make_iovec buffers len in ( iovec , len , buffers ) end
module Msghdr = struct type msghdr type t = msghdr * Sockaddr . t option * Iovec . t external make_msghdr : int -> Unix . file_descr list -> Sockaddr . t option -> Iovec . t -> msghdr = " ocaml_uring_make_msghdr " external get_msghdr_fds : msghdr -> Unix . file_descr list = " ocaml_uring_get_msghdr_fds " let get_fds ( hdr , _ , _ ) = get_msghdr_fds hdr let create_with_addr ~ n_fds ~ fds ? addr buffs = let iovs = Iovec . make buffs in make_msghdr n_fds fds addr iovs , addr , iovs let create ( ? n_fds = 0 ) ? addr buffs = create_with_addr ~ n_fds ~ fds [ ] : ? addr buffs end
type ' a job = ' a Heap . entry
module Uring = struct type t external create : int -> int option -> t = " ocaml_uring_setup " external exit : t -> unit = " ocaml_uring_exit " external unregister_buffers : t -> unit = " ocaml_uring_unregister_buffers " external register_bigarray : t -> Cstruct . buffer -> unit = " ocaml_uring_register_ba " external submit : t -> int = " ocaml_uring_submit " type id = Heap . ptr type offset = Optint . Int63 . t external submit_nop : t -> id -> bool = " ocaml_uring_submit_nop " [ @@ noalloc ] external submit_poll_add : t -> Unix . file_descr -> id -> Poll_mask . t -> bool = " ocaml_uring_submit_poll_add " [ @@ noalloc ] external submit_readv : t -> Unix . file_descr -> id -> Iovec . t -> offset -> bool = " ocaml_uring_submit_readv " [ @@ noalloc ] external submit_writev : t -> Unix . file_descr -> id -> Iovec . t -> offset -> bool = " ocaml_uring_submit_writev " [ @@ noalloc ] external submit_readv_fixed : t -> Unix . file_descr -> id -> Cstruct . buffer -> int -> int -> offset -> bool = " ocaml_uring_submit_readv_fixed_byte " " ocaml_uring_submit_readv_fixed_native " [ @@ noalloc ] external submit_writev_fixed : t -> Unix . file_descr -> id -> Cstruct . buffer -> int -> int -> offset -> bool = " ocaml_uring_submit_writev_fixed_byte " " ocaml_uring_submit_writev_fixed_native " [ @@ noalloc ] external submit_close : t -> Unix . file_descr -> id -> bool = " ocaml_uring_submit_close " [ @@ noalloc ] external submit_splice : t -> id -> Unix . file_descr -> Unix . file_descr -> int -> bool = " ocaml_uring_submit_splice " [ @@ noalloc ] external submit_connect : t -> id -> Unix . file_descr -> Sockaddr . t -> bool = " ocaml_uring_submit_connect " [ @@ noalloc ] external submit_accept : t -> id -> Unix . file_descr -> Sockaddr . t -> bool = " ocaml_uring_submit_accept " [ @@ noalloc ] external submit_cancel : t -> id -> id -> bool = " ocaml_uring_submit_cancel " [ @@ noalloc ] external submit_openat2 : t -> id -> Unix . file_descr -> Open_how . t -> bool = " ocaml_uring_submit_openat2 " [ @@ noalloc ] external submit_send_msg : t -> id -> Unix . file_descr -> Msghdr . t -> bool = " ocaml_uring_submit_send_msg " [ @@ noalloc ] external submit_recv_msg : t -> id -> Unix . file_descr -> Msghdr . t -> bool = " ocaml_uring_submit_recv_msg " [ @@ noalloc ] type cqe_option = private | Cqe_none | Cqe_some of { user_data_id : id ; res : int } [ @@ ocaml . warning " - 37 " ] external wait_cqe : t -> cqe_option = " ocaml_uring_wait_cqe " external wait_cqe_timeout : float -> t -> cqe_option = " ocaml_uring_wait_cqe_timeout " external peek_cqe : t -> cqe_option = " ocaml_uring_peek_cqe " external error_of_errno : int -> Unix . error = " ocaml_uring_error_of_errno " end
type ' a t = { id : < ; > uring : Uring . t ; mutable fixed_iobuf : Cstruct . buffer ; data : ' a Heap . t ; queue_depth : int ; mutable dirty : bool ; }
module Generic_ring = struct type ring = T : ' a t -> ring type t = ring let compare ( T a ) ( T b ) = compare a . id b . id end
let gc_roots = Atomic . make Ring_set . empty
let rec update_gc_roots fn = let old_set = Atomic . get gc_roots in let new_set = fn old_set in if not ( Atomic . compare_and_set gc_roots old_set new_set ) then update_gc_roots fn
let register_gc_root t = update_gc_roots ( Ring_set . add ( Generic_ring . T t ) )
let unregister_gc_root t = update_gc_roots ( Ring_set . remove ( Generic_ring . T t ) )
let create ? polling_timeout ~ queue_depth ( ) = if queue_depth < 1 then Fmt . invalid_arg " Non - positive queue depth : % d " queue_depth ; let uring = Uring . create queue_depth polling_timeout in let data = Heap . create queue_depth in let id = object end in let fixed_iobuf = Cstruct . empty . buffer in let t = { id ; uring ; fixed_iobuf ; data ; dirty = false ; queue_depth } in register_gc_root t ; t
let ensure_idle t op = match Heap . in_use t . data with | 0 -> ( ) | n -> Fmt . invalid_arg " % s : % d request ( s ) still active " ! op n
let set_fixed_buffer t iobuf = ensure_idle t " set_fixed_buffer " ; if Bigarray . Array1 . dim t . fixed_iobuf > 0 then Uring . unregister_buffers t . uring ; t . fixed_iobuf <- iobuf ; if Bigarray . Array1 . dim iobuf > 0 then ( match Uring . register_bigarray t . uring iobuf with | ( ) -> Ok ( ) | exception Unix . Unix_error ( Unix . ENOMEM , " io_uring_register_buffers " , " " ) -> Error ` ENOMEM ) else Ok ( )
let exit t = ensure_idle t " exit " ; Uring . exit t . uring ; unregister_gc_root t
let with_id_full : type a . a t -> ( Heap . ptr -> bool ) -> a -> extra_data ' : b -> a job option = fun t fn datum ~ extra_data -> match Heap . alloc t . data datum ~ extra_data with | exception Heap . No_space -> None | entry -> let ptr = Heap . ptr entry in let has_space = fn ptr in if has_space then ( t . dirty <- true ; Some entry ) else ( ignore ( Heap . free t . data ptr : a ) ; None )
let with_id t fn a = with_id_full t fn a ~ extra_data ( ) :
let noop t user_data = with_id t ( fun id -> Uring . submit_nop t . uring id ) user_data
let at_fdcwd : Unix . file_descr = Obj . magic Config . at_fdcwd
let openat2 t ~ access ~ flags ~ perm ~ resolve ( ? fd = at_fdcwd ) path user_data = let open_flags = flags lor match access with | ` R -> Open_flags . rdonly | ` W -> Open_flags . wronly | ` RW -> Open_flags . rdwr in let open_how = Open_how . v ~ open_flags ~ perm ~ resolve path in with_id_full t ( fun id -> Uring . submit_openat2 t . uring id fd open_how ) user_data ~ extra_data : open_how
let readv t ~ file_offset fd buffers user_data = let iovec = Iovec . make buffers in with_id_full t ( fun id -> Uring . submit_readv t . uring fd id iovec file_offset ) user_data ~ extra_data : iovec
let read_fixed t ~ file_offset fd ~ off ~ len user_data = with_id t ( fun id -> Uring . submit_readv_fixed t . uring fd id t . fixed_iobuf off len file_offset ) user_data
let read_chunk ? len t ~ file_offset fd chunk user_data = let { Cstruct . buffer ; off ; len } = Region . to_cstruct ? len chunk in if buffer != t . fixed_iobuf then invalid_arg " Chunk does not belong to ring " ; ! with_id t ( fun id -> Uring . submit_readv_fixed t . uring fd id t . fixed_iobuf off len file_offset ) user_data
let write_fixed t ~ file_offset fd ~ off ~ len user_data = with_id t ( fun id -> Uring . submit_writev_fixed t . uring fd id t . fixed_iobuf off len file_offset ) user_data
let write_chunk ? len t ~ file_offset fd chunk user_data = let { Cstruct . buffer ; off ; len } = Region . to_cstruct ? len chunk in if buffer != t . fixed_iobuf then invalid_arg " Chunk does not belong to ring " ; ! with_id t ( fun id -> Uring . submit_writev_fixed t . uring fd id t . fixed_iobuf off len file_offset ) user_data
let writev t ~ file_offset fd buffers user_data = let iovec = Iovec . make buffers in with_id_full t ( fun id -> Uring . submit_writev t . uring fd id iovec file_offset ) user_data ~ extra_data : iovec
let poll_add t fd poll_mask user_data = with_id t ( fun id -> Uring . submit_poll_add t . uring fd id poll_mask ) user_data
let close t fd user_data = with_id t ( fun id -> Uring . submit_close t . uring fd id ) user_data
let splice t ~ src ~ dst ~ len user_data = with_id t ( fun id -> Uring . submit_splice t . uring id src dst len ) user_data
let connect t fd addr user_data = let addr = Sockaddr . of_unix addr in with_id_full t ( fun id -> Uring . submit_connect t . uring id fd addr ) user_data ~ extra_data : addr
let accept t fd addr user_data = with_id_full t ( fun id -> Uring . submit_accept t . uring id fd addr ) user_data ~ extra_data : addr
let send_msg ( ? fds [ ] ) = ? dst t fd buffers user_data = let addr = Option . map Sockaddr . of_unix dst in let n_fds = List . length fds in let msghdr = Msghdr . create_with_addr ~ n_fds ~ fds ? addr buffers in with_id_full t ( fun id -> Uring . submit_send_msg t . uring id fd msghdr ) user_data ~ extra_data : msghdr
let recv_msg t fd msghdr user_data = with_id_full t ( fun id -> Uring . submit_recv_msg t . uring id fd msghdr ) user_data ~ extra_data : msghdr
let cancel t job user_data = ignore ( Heap . ptr job : Uring . id ) ; with_id t ( fun id -> Uring . submit_cancel t . uring id ( Heap . ptr job ) ) user_data
let submit t = if t . dirty then begin t . dirty <- false ; Uring . submit t . uring end else 0
type ' a completion_option = | None | Some of { result : int ; data : ' a }
let fn_on_ring fn t = match fn t . uring with | Uring . Cqe_none -> None | Uring . Cqe_some { user_data_id ; res } -> let data = Heap . free t . data user_data_id in Some { result = res ; data }
let peek t = fn_on_ring Uring . peek_cqe t
let wait ? timeout t = match timeout with | None -> fn_on_ring Uring . wait_cqe t | Some timeout -> fn_on_ring ( Uring . wait_cqe_timeout timeout ) t
let queue_depth { queue_depth ; _ } = queue_depth
let buf { fixed_iobuf ; _ } = fixed_iobuf