2016-02-19 00:20:28 +01:00
|
|
|
open Qptypes
|
2017-08-18 18:28:33 +02:00
|
|
|
open Core
|
2014-08-26 15:31:16 +02:00
|
|
|
|
|
|
|
(*
|
|
|
|
Type for bits strings
|
|
|
|
=====================
|
|
|
|
|
|
|
|
list of Bits
|
|
|
|
*)
|
|
|
|
|
2014-10-26 17:29:11 +01:00
|
|
|
type t = Bit.t list
|
2014-08-26 15:31:16 +02:00
|
|
|
|
|
|
|
(* String representation *)
|
|
|
|
let to_string b =
|
|
|
|
let rec do_work accu = function
|
|
|
|
| [] -> accu
|
|
|
|
| head :: tail ->
|
|
|
|
let new_accu = (Bit.to_string head) ^ accu
|
|
|
|
in do_work new_accu tail
|
|
|
|
in
|
|
|
|
do_work "" b
|
2016-02-19 00:20:28 +01:00
|
|
|
|
2014-08-26 15:31:16 +02:00
|
|
|
|
2014-11-03 15:37:02 +01:00
|
|
|
let of_string ?(zero='0') ?(one='1') s =
|
|
|
|
String.to_list s
|
|
|
|
|> List.rev_map ~f:( fun c ->
|
|
|
|
if (c = zero) then Bit.Zero
|
|
|
|
else if (c = one) then Bit.One
|
2016-02-19 00:20:28 +01:00
|
|
|
else (failwith ("Error in bitstring ") ) )
|
|
|
|
|
2016-02-19 21:04:27 +01:00
|
|
|
let of_string_mp s =
|
|
|
|
String.to_list s
|
|
|
|
|> List.rev_map ~f:(function
|
|
|
|
| '-' -> Bit.Zero
|
|
|
|
| '+' -> Bit.One
|
|
|
|
| _ -> failwith ("Error in bitstring ") )
|
2016-02-19 00:20:28 +01:00
|
|
|
|
2014-08-26 15:31:16 +02:00
|
|
|
|
|
|
|
(* Create a bit list from an int64 *)
|
|
|
|
let of_int64 i =
|
2016-02-19 21:04:27 +01:00
|
|
|
|
|
|
|
let rec do_work accu = function
|
|
|
|
| 0L -> Bit.Zero :: accu |> List.rev
|
|
|
|
| 1L -> Bit.One :: accu |> List.rev
|
|
|
|
| i ->
|
|
|
|
let b =
|
|
|
|
match (Int64.bit_and i 1L ) with
|
|
|
|
| 0L -> Bit.Zero
|
|
|
|
| 1L -> Bit.One
|
|
|
|
| _ -> raise (Failure "i land 1 not in (0,1)")
|
|
|
|
in
|
|
|
|
do_work (b :: accu) (Int64.shift_right_logical i 1)
|
2014-08-26 15:31:16 +02:00
|
|
|
in
|
2016-02-19 21:04:27 +01:00
|
|
|
|
2014-08-26 15:31:16 +02:00
|
|
|
let adjust_length result =
|
|
|
|
let rec do_work accu = function
|
2016-02-19 00:20:28 +01:00
|
|
|
| 64 -> List.rev accu
|
2014-08-26 15:31:16 +02:00
|
|
|
| i when i>64 -> raise (Failure "Error in of_int64 > 64")
|
|
|
|
| i when i<0 -> raise (Failure "Error in of_int64 < 0")
|
2016-02-19 00:20:28 +01:00
|
|
|
| i -> do_work (Bit.Zero :: accu) (i+1)
|
2014-08-26 15:31:16 +02:00
|
|
|
in
|
2016-02-19 00:20:28 +01:00
|
|
|
do_work (List.rev result) (List.length result)
|
2014-08-26 15:31:16 +02:00
|
|
|
in
|
2016-02-19 21:04:27 +01:00
|
|
|
adjust_length (do_work [] i)
|
2016-02-19 00:20:28 +01:00
|
|
|
|
2014-08-26 15:31:16 +02:00
|
|
|
|
|
|
|
(* Create an int64 from a bit list *)
|
|
|
|
let to_int64 l =
|
|
|
|
assert ( (List.length l) <= 64) ;
|
|
|
|
let rec do_work accu = function
|
|
|
|
| [] -> accu
|
|
|
|
| Bit.Zero::tail -> do_work Int64.(shift_left accu 1) tail
|
2014-11-03 15:37:02 +01:00
|
|
|
| Bit.One::tail -> do_work Int64.(bit_or one (shift_left accu 1)) tail
|
2014-08-26 15:31:16 +02:00
|
|
|
in do_work Int64.zero (List.rev l)
|
2016-02-19 00:20:28 +01:00
|
|
|
|
2014-08-26 15:31:16 +02:00
|
|
|
|
|
|
|
(* Create a bit list from a list of int64 *)
|
|
|
|
let of_int64_list l =
|
2014-11-03 15:37:02 +01:00
|
|
|
List.map ~f:of_int64 l
|
|
|
|
|> List.concat
|
2016-02-19 00:20:28 +01:00
|
|
|
|
2016-02-22 23:33:30 +01:00
|
|
|
(* Create a bit list from an array of int64 *)
|
|
|
|
let of_int64_array l =
|
|
|
|
Array.map ~f:of_int64 l
|
|
|
|
|> Array.to_list
|
|
|
|
|> List.concat
|
|
|
|
|
2014-08-26 15:31:16 +02:00
|
|
|
|
2014-09-17 11:49:00 +02:00
|
|
|
(* Compute n_int *)
|
|
|
|
let n_int_of_mo_tot_num mo_tot_num =
|
2014-09-17 12:34:31 +02:00
|
|
|
let bit_kind_size = Bit_kind_size.to_int (Lazy.force Qpackage.bit_kind_size) in
|
2014-09-17 11:49:00 +02:00
|
|
|
N_int_number.of_int ( (mo_tot_num-1)/bit_kind_size + 1 )
|
2016-02-19 00:20:28 +01:00
|
|
|
|
2014-09-17 11:49:00 +02:00
|
|
|
|
|
|
|
(* Create a zero bit list *)
|
2014-09-17 00:39:21 +02:00
|
|
|
let zero n_int =
|
|
|
|
let n_int = N_int_number.to_int n_int in
|
|
|
|
let a = Array.init n_int (fun i-> 0L) in
|
|
|
|
of_int64_list ( Array.to_list a )
|
2016-02-19 00:20:28 +01:00
|
|
|
|
2014-09-17 00:39:21 +02:00
|
|
|
|
2014-08-26 15:31:16 +02:00
|
|
|
(* Create an int64 list from a bit list *)
|
|
|
|
let to_int64_list l =
|
|
|
|
let rec do_work accu buf counter = function
|
|
|
|
| [] ->
|
|
|
|
begin
|
|
|
|
match buf with
|
|
|
|
| [] -> accu
|
|
|
|
| _ -> (List.rev buf)::accu
|
|
|
|
end
|
|
|
|
| i::tail ->
|
|
|
|
if (counter < 64) then
|
|
|
|
do_work accu (i::buf) (counter+1) tail
|
|
|
|
else
|
|
|
|
do_work ( (List.rev (i::buf))::accu) [] 1 tail
|
|
|
|
in
|
|
|
|
let l = do_work [] [] 1 l
|
|
|
|
in
|
2014-11-03 15:37:02 +01:00
|
|
|
List.rev_map ~f:to_int64 l
|
2016-02-19 00:20:28 +01:00
|
|
|
|
2016-02-19 21:04:27 +01:00
|
|
|
(* Create an array of int64 from a bit list *)
|
|
|
|
let to_int64_array l =
|
|
|
|
to_int64_list l
|
|
|
|
|> Array.of_list
|
2014-08-26 15:31:16 +02:00
|
|
|
|
|
|
|
(* Create a bit list from a list of MO indices *)
|
|
|
|
let of_mo_number_list n_int l =
|
|
|
|
let n_int = N_int_number.to_int n_int in
|
|
|
|
let length = n_int*64 in
|
2014-11-03 15:37:02 +01:00
|
|
|
let a = Array.create length (Bit.Zero) in
|
|
|
|
List.iter ~f:(fun i-> a.((MO_number.to_int i)-1) <- Bit.One) l;
|
2014-08-26 15:31:16 +02:00
|
|
|
Array.to_list a
|
2016-02-19 00:20:28 +01:00
|
|
|
|
2014-08-26 15:31:16 +02:00
|
|
|
|
2014-09-16 18:58:42 +02:00
|
|
|
let to_mo_number_list l =
|
|
|
|
let a = Array.of_list l in
|
2014-10-30 16:26:31 +01:00
|
|
|
let mo_tot_num = MO_number.get_max () in
|
2014-09-16 18:58:42 +02:00
|
|
|
let rec do_work accu = function
|
|
|
|
| 0 -> accu
|
|
|
|
| i ->
|
|
|
|
begin
|
|
|
|
let new_accu =
|
|
|
|
match a.(i-1) with
|
2014-10-30 16:26:31 +01:00
|
|
|
| Bit.One -> (MO_number.of_int ~max:mo_tot_num i)::accu
|
2014-09-16 18:58:42 +02:00
|
|
|
| Bit.Zero -> accu
|
|
|
|
in
|
|
|
|
do_work new_accu (i-1)
|
|
|
|
end
|
|
|
|
in
|
|
|
|
do_work [] (List.length l)
|
2016-02-19 00:20:28 +01:00
|
|
|
|
2014-09-16 18:58:42 +02:00
|
|
|
|
2014-08-26 15:31:16 +02:00
|
|
|
|
|
|
|
|
|
|
|
(* logical operations on bit_list *)
|
|
|
|
let logical_operator2 op a b =
|
|
|
|
let rec do_work_binary result a b =
|
|
|
|
match a, b with
|
|
|
|
| [], [] -> result
|
|
|
|
| [], _ | _ , [] -> raise (Failure "Lists should have same length")
|
|
|
|
| (ha::ta), (hb::tb) ->
|
|
|
|
let newbit = op ha hb
|
|
|
|
in do_work_binary (newbit::result) ta tb
|
|
|
|
in
|
|
|
|
List.rev (do_work_binary [] a b)
|
2016-02-19 00:20:28 +01:00
|
|
|
|
2014-08-26 15:31:16 +02:00
|
|
|
|
|
|
|
let logical_operator1 op b =
|
|
|
|
let rec do_work_unary result b =
|
|
|
|
match b with
|
|
|
|
| [] -> result
|
|
|
|
| (hb::tb) ->
|
|
|
|
let newbit = op hb
|
|
|
|
in do_work_unary (newbit::result) tb
|
|
|
|
in
|
|
|
|
List.rev (do_work_unary [] b)
|
|
|
|
|
2016-02-19 00:20:28 +01:00
|
|
|
|
|
|
|
let and_operator a b = logical_operator2 Bit.and_operator a b
|
|
|
|
let xor_operator a b = logical_operator2 Bit.xor_operator a b
|
|
|
|
let or_operator a b = logical_operator2 Bit.or_operator a b
|
|
|
|
let not_operator b = logical_operator1 Bit.not_operator b
|
2014-08-26 15:31:16 +02:00
|
|
|
|
2014-10-20 12:19:12 +02:00
|
|
|
|
|
|
|
let popcnt b =
|
2016-02-19 21:04:27 +01:00
|
|
|
List.fold_left b ~init:0 ~f:(fun accu -> function
|
|
|
|
| Bit.One -> accu+1
|
|
|
|
| Bit.Zero -> accu
|
|
|
|
)
|
2016-02-19 00:20:28 +01:00
|
|
|
|
2014-10-20 12:19:12 +02:00
|
|
|
|
|
|
|
|