10
0
mirror of https://github.com/LCPQ/quantum_package synced 2024-06-01 02:45:29 +02:00
quantum_package/ocaml/Molecule.ml

129 lines
3.3 KiB
OCaml
Raw Normal View History

2014-08-24 20:00:26 +02:00
open Core.Std ;;
open Qptypes ;;
exception MultiplicityError of string;;
type t = {
nuclei : Atom.t list ;
2014-10-23 14:42:14 +02:00
elec_alpha : Elec_alpha_number.t ;
elec_beta : Elec_beta_number.t ;
2014-10-25 21:24:21 +02:00
} with sexp
2014-08-24 20:00:26 +02:00
2014-08-26 14:39:23 +02:00
let get_charge { nuclei ; elec_alpha ; elec_beta } =
2014-10-23 14:42:14 +02:00
let result = (Elec_alpha_number.to_int elec_alpha) +
(Elec_beta_number.to_int elec_beta) in
2014-08-24 20:00:26 +02:00
let rec nucl_charge = function
2014-10-07 19:33:11 +02:00
| a::rest -> (Charge.to_float a.Atom.charge) +. nucl_charge rest
2014-08-24 20:00:26 +02:00
| [] -> 0.
in
2014-10-07 19:33:11 +02:00
Charge.of_float (nucl_charge nuclei -. (Float.of_int result))
2014-08-24 20:00:26 +02:00
;;
2014-08-26 14:39:23 +02:00
let get_multiplicity m =
2014-10-23 14:42:14 +02:00
let elec_alpha = m.elec_alpha in
2014-10-21 23:23:37 +02:00
Multiplicity.of_alpha_beta elec_alpha m.elec_beta
2014-08-24 20:00:26 +02:00
;;
2014-08-27 16:38:13 +02:00
let get_nucl_num m =
2014-10-30 16:26:31 +01:00
let nmax = (List.length m.nuclei) in
Nucl_number.of_int nmax ~max:nmax
2014-08-27 16:38:13 +02:00
;;
2014-08-24 20:00:26 +02:00
let name m =
2014-10-07 19:33:11 +02:00
let cm = Charge.to_int (get_charge m) in
2014-08-24 20:00:26 +02:00
let c =
match cm with
| 0 -> ""
| 1 -> " (+)"
| (-1) -> " (-)"
| i when i>1 -> Printf.sprintf " (%d+)" i
| i -> Printf.sprintf " (%d-)" (-i)
in
2014-08-26 14:39:23 +02:00
let mult = Multiplicity.to_string (get_multiplicity m) in
2014-08-24 20:00:26 +02:00
let { nuclei ; elec_alpha ; elec_beta } = m in
let rec build_list accu = function
| a::rest ->
begin
let e = a.Atom.element in
match (List.Assoc.find accu e) with
| None -> build_list (List.Assoc.add accu e 1) rest
| Some i -> build_list (List.Assoc.add accu e (i+1)) rest
end
| [] -> accu
in
let rec build_name accu = function
| (a, n)::rest ->
let a = Element.to_string a in
begin
match n with
| 1 -> build_name (a::accu) rest
| i when i>1 ->
let tmp = Printf.sprintf "%s%d" a i
in build_name (tmp::accu) rest
| _ -> assert false
end
| [] -> accu
in
let result = build_list [] nuclei |> build_name [c ; ", " ; mult]
in
String.concat (result)
;;
let to_string m =
let { nuclei ; elec_alpha ; elec_beta } = m in
let n = List.length nuclei in
let title = name m in
2014-10-07 19:33:11 +02:00
[ Int.to_string n ; title ] @ (List.map ~f:(fun x -> Atom.to_string
Units.Angstrom x) nuclei)
2014-08-26 14:39:23 +02:00
|> String.concat ~sep:"\n"
2014-08-24 20:00:26 +02:00
;;
2014-08-26 14:39:23 +02:00
let of_xyz_string
?(charge=(Charge.of_int 0)) ?(multiplicity=(Multiplicity.of_int 1))
2014-10-07 19:33:11 +02:00
?(units=Units.Angstrom)
2014-08-26 14:39:23 +02:00
s =
2014-08-24 20:00:26 +02:00
let l = String.split s ~on:'\n'
|> List.filter ~f:(fun x -> x <> "")
2014-09-18 17:01:43 +02:00
|> List.map ~f:(fun x -> Atom.of_string units x)
2014-08-24 20:00:26 +02:00
in
2014-08-26 14:39:23 +02:00
let ne = ( get_charge {
2014-08-24 20:00:26 +02:00
nuclei=l ;
2014-10-23 14:42:14 +02:00
elec_alpha=(Elec_alpha_number.of_int 1) ;
elec_beta=(Elec_beta_number.of_int 0) }
2014-10-07 19:33:11 +02:00
|> Charge.to_int
) + 1 - (Charge.to_int charge)
2014-10-23 14:42:14 +02:00
|> Elec_number.of_int
2014-08-24 20:00:26 +02:00
in
2014-08-26 14:39:23 +02:00
let (na,nb) = Multiplicity.to_alpha_beta ne multiplicity in
2014-08-24 20:00:26 +02:00
let result =
{ nuclei = l ;
2014-10-23 14:42:14 +02:00
elec_alpha = na ;
elec_beta = nb }
2014-08-24 20:00:26 +02:00
in
2014-08-26 14:39:23 +02:00
if ((get_multiplicity result) <> multiplicity) then
2014-08-24 20:00:26 +02:00
let msg = Printf.sprintf
"With %d electrons multiplicity %d is impossible"
2014-10-23 14:42:14 +02:00
(Elec_number.to_int ne)
2014-08-26 14:39:23 +02:00
(Multiplicity.to_int multiplicity)
2014-08-24 20:00:26 +02:00
in
raise (MultiplicityError msg);
else () ;
result
;;
2014-08-26 14:39:23 +02:00
let of_xyz_file
?(charge=(Charge.of_int 0)) ?(multiplicity=(Multiplicity.of_int 1))
?(units=Units.Angstrom)
2014-08-26 14:39:23 +02:00
filename =
let (_,buffer) = In_channel.read_all filename
|> String.lsplit2_exn ~on:'\n' in
let (_,buffer) = String.lsplit2_exn buffer ~on:'\n' in
of_xyz_string ~charge:charge ~multiplicity:multiplicity
~units:units buffer
;;
include To_md5;;
let to_md5 = to_md5 sexp_of_t
2014-08-26 14:39:23 +02:00
;;