Caml1999I036(.Lift_constants.lift_constantsZ@'Flambda'program@@@'backend,Backend_intf!S@@'program@@@@@@@@ %middle_end/flambda/lift_constants.mli~  A  @@'@@@@T.Lift_constants0Ǖw@!)G9U(Warnings0;w.Q=1(Variable0*@wAà2Var_within_closure0/8S^a<)?)Unit_info08a AnMͼ %Types0#`O(ߍLF.Type_immediacy0GuQT@<=#Tag0H 0we` l&Symbol0!%%eEIm蠠%Subst09,+bmT-Stdlib__Uchar0d"W-x9.Stdlib__Domain0iW',P6wz.Stdlib__Digest0 Jjrڵ6.Stdlib__Buffer0_?K|/V>O}~Nࠠ&Stdlib0y{x!O!0Static_exception0=m 3Simple_value_approx0΍FU  t"%Shape0OĸT>b6Set_of_closures_origin05tQ]2Set_of_closures_id0fA*Projection0s&[\wIihIS S)Primitive0{mV|{J $Path09{ְZsv)Parsetree0Z<4$PC)Parameter0zo0:q۠+Outcometree0yl4>Yfܠ'Numbers0I3:+8Р0Mutable_variable0Ğ*5WB{y$Misc0  =73 Z )Longident0@#j,6.Nt蠠(Location0nݹV 2f-V )Load_path02&9Q҄;L,Linkage_name0"s_nظfS=&Lambda0 [, U(Z7Internal_variable_names08ߋA#99,Identifiable0XnAZ4eҠ%Ident0y43a$+*Freshening0%mma>V/*Format_doc0Mv9630A 'Flambda06>iz; 1)Export_id0F~=/M #Env0؞X:Fݗ))Debuginfo0.6硏]fSvi*Data_types0-k(.I70Compilation_unit0&G 0\jР*Cmi_format0KuEB젠.Closure_origin0$A2vJsf{#*Closure_id0\t#:Ն=Ġ/Closure_element0e G(^2Clambda_primitives0H_W— >y}UMܠ0CamlinternalLazy0;x#5䢜hLm8CamlinternalFormatBasics0oZ2t,ݠ5Build_path_prefix_map0gMOBnM`,Backend_intf0?oF9E(1CW!(Asttypes0E\eǥ]k6e/Allocated_const0$' Y`E&@@@Caml1999T036-%C.Lift_constants-ocaml.warning %middle_end/flambda/lift_constants.mliQQ@2+a-4-9-30-40-41-42 QQ@@QQ@@@@@@QQ@3@@@@@@#intA;@@@A@@@@@&_none_@@A@A@$charB;@@A@@@@@@A@&stringQ;@@ A@@@@@ @@@%bytesC;@@A@@@@@@@@%floatD;@@A@@@@@@@@$boolE;@@%falsec@@@$trued@@#@@@A@@@@@$@A@$unitF;@@"()e@@.@@@A@@@@@/@A@ #exnG;@@@A@@@@@3@@@#effH;@@O@A@A@@@@@@<@@@,continuationI;@@Q@@P@B@A@nY@@@@@@K@@@%arrayJ;@@R@A@A@@@@@@U@@@ $listK;@@S@A"[]f@@b@"::g@@@T@@o@ @@A@Y@@@@@r@@@&optionL;@@V@A$Noneh@@@$Somei@@@@@A@Y@@@@@@@@)nativeintM;@@A@@@@@@@@%int32N;@@A@@@@@@@@%int64O;@@A@@@@@@@@&lazy_tP;@@X@AJA@Y@@@@@@@@5extension_constructorR;@@A@@@@@@@@*floatarrayS;@@A@@@@@@@@&iarrayT;@@Y@A[A@Y@@@@@@@@*atomic_locU;@@Z@AdA@@@@@@@@@.Assert_failure`#@@@@@J@@@@@@@@[@@AϠ=ocaml.warn_on_literal_patternӐ@@0Division_by_zero]#@@@A٠  @+End_of_file\#$@@@Aᠰ@'FailureY#,@'@@A꠰@0Invalid_argumentX#5@0@@A󠰠$#@-Match_failureV#>@@=@9@;@@a@@A54@)Not_foundZ#O@@@A =<@-Out_of_memoryW#W@@@AED@.Stack_overflow^#_@@@AML@.Sys_blocked_io_#g@@@A$U'T'@)Sys_error[#o@j@@A-^0]0@:Undefined_recursive_modulea#x@@w@s@u@@h@@A>oAnA@:Continuation_already_takenb#@@@AFwIvI@&Stdlib@Azy@*ocaml.textT  The aim of this pass is to assign symbols to values known to be constant (in other words, whose values we know at compile time), with appropriate sharing of constants, and replace the occurrences of the constants with their corresponding symbols. This pass uses the results of two other passes, [Inconstant_idents] and [Alias_analysis]. The relationship between these two deserves some attention. [Inconstant_idents] is a "backwards" analysis that propagates implications about inconstantness of variables and set of closures IDs. [Alias_analysis] is a "forwards" analysis that is analogous to the propagation of [Simple_value_approx.t] values during [Inline_and_simplify]. It gives us information about relationships between values but not actually about their constantness. Combining these two into a single pass has been attempted previously, but was not thought to be successful; this experiment could be repeated in the future. (If "constant" is considered as "top" and "inconstant" is considered as "bottom", then [Alias_analysis] corresponds to a least fixed point and [Inconstant_idents] corresponds to a greatest fixed point.) At a high level, this pass operates as follows. Symbols are assigned to variables known to be constant and their defining expressions examined. Based on the results of [Alias_analysis], we simplify the destructive elements within the defining expressions (specifically, projection of fields from blocks), to eventually yield [Flambda.constant_defining_value]s that are entirely constructive. These will be bound to symbols in the resulting program. Another approach to this pass could be to only use the results of [Inconstant_idents] and then repeatedly lift constants and run [Inline_and_simplify] until a fixpoint. It was thought more robust to instead use [Alias_analysis], where the fixpointing involves a less complicated function. We still run [Inline_and_simplify] once after this pass since the lifting of constants may enable more functions to become closed; the simplification pass provides an easy way of cleaning up (e.g. making sure [free_vars] maps in sets of closures are correct). S|  @@@@@@.lift_constantsW~  ~  @б@г'Flambda'program'Flambda    @     @@@@@@ q @@б'backendЙ,Backend_intf!S@,Backend_intf@  @  @ @  @  @@@@ rͰ@  @  @@г:'program'FlambdaA  A  @ A  A  @@@@@@ s @@8@@ t@   @@@B@@ uJ @@@~  @@@@@@@@f@@3@h @A@ H************************************************************************A@@A@L@ H BMMBM@ H OCaml CC@ H "D#D3@ H Pierre Chambart, OCamlPro (E44)E4@ H Mark Shinwell and Leo White, Jane Street Europe .F/F@ H 4G5G@ H Copyright 2013--2016 OCamlPro SAS :H;Hg@ H Copyright 2014--2016 Jane Street Group LLC @IhhAIh@ H FJGJ@ H All rights reserved. This file is distributed under the terms of LKMKN@ H the GNU Lesser General Public License version 2.1, with the RLOOSLO@ H special exception on linking described in the file LICENSE. XMYM@ H ^N_N5@ H************************************************************************dO66eO6@ * The aim of this pass is to assign symbols to values known to be constant (in other words, whose values we know at compile time), with appropriate sharing of constants, and replace the occurrences of the constants with their corresponding symbols. This pass uses the results of two other passes, [Inconstant_idents] and [Alias_analysis]. The relationship between these two deserves some attention. [Inconstant_idents] is a "backwards" analysis that propagates implications about inconstantness of variables and set of closures IDs. [Alias_analysis] is a "forwards" analysis that is analogous to the propagation of [Simple_value_approx.t] values during [Inline_and_simplify]. It gives us information about relationships between values but not actually about their constantness. Combining these two into a single pass has been attempted previously, but was not thought to be successful; this experiment could be repeated in the future. (If "constant" is considered as "top" and "inconstant" is considered as "bottom", then [Alias_analysis] corresponds to a least fixed point and [Inconstant_idents] corresponds to a greatest fixed point.) At a high level, this pass operates as follows. Symbols are assigned to variables known to be constant and their defining expressions examined. Based on the results of [Alias_analysis], we simplify the destructive elements within the defining expressions (specifically, projection of fields from blocks), to eventually yield [Flambda.constant_defining_value]s that are entirely constructive. These will be bound to symbols in the resulting program. Another approach to this pass could be to only use the results of [Inconstant_idents] and then repeatedly lift constants and run [Inline_and_simplify] until a fixpoint. It was thought more robust to instead use [Alias_analysis], where the fixpointing involves a less complicated function. We still run [Inline_and_simplify] once after this pass since the lifting of constants may enable more functions to become closed; the simplification pass provides an easy way of cleaning up (e.g. making sure [free_vars] maps in sets of closures are correct). @-./boot/ocamlc)-nostdlib"-I&./boot*-use-prims2runtime/primitives"-g0-strict-sequence*-principal(-absname"-w8+a-4-9-40-41-42-44-45-48+-warn-error"+a*-bin-annot/-strict-formats"-I2middle_end/flambda"-I%utils"-I'parsing"-I&typing"-I(bytecomp"-I,file_formats"-I&lambda"-I*middle_end"-I2middle_end/closure"-I2middle_end/flambda"-I=middle_end/flambda/base_types"-I'asmcomp"-I&driver"-I(toplevel"-I%tools"-I'runtime"-I1otherlibs/dynlink"-I-otherlibs/str"-I4otherlibs/systhreads"-I.otherlibs/unix"-I8otherlibs/runtime_events"-c ;/builds/workspace/main/flambda/false/label/ocaml-freebsd-64 >10/.-,+*)('&%$#"! @@0;g[^8 D3@@@/Allocated_const0$' Y`E&(Asttypes0E\eǥ]k6e0?oF9E(1CW!5Build_path_prefix_map0gMOBnM`8CamlinternalFormatBasics0oZ2t,ݠ0CamlinternalLazy0;x#5䢜hLm2Clambda_primitives0H_W— >y}UMܠ/Closure_element0e G(^*Closure_id0\t#:Ն=Ġ.Closure_origin0$A2vJsf{#*Cmi_format0KuEB젠0Compilation_unit0&G 0\jР*Data_types0-k(.I7)Debuginfo0.6硏]fSvi#Env0؞X:Fݗ))Export_id0F~=/M ]06>iz; 1*Format_doc0Mv9630A *Freshening0%mma>V/%Ident0y43a$+,Identifiable0XnAZ4eҠ7Internal_variable_names08ߋA#99&Lambda0 [, U(Z@0Ǖw@!)G9U,Linkage_name0"s_nظfS=)Load_path02&9Q҄;L(Location0nݹV 2f-V )Longident0@#j,6.Nt蠠$Misc0  =73 Z 0Mutable_variable0Ğ*5WB{y'Numbers0I3:+8Р+Outcometree0yl4>Yfܠ)Parameter0zo0:q۠)Parsetree0Z<4$PC$Path09{ְZsv)Primitive0{mV|{J *Projection0s&[\wIihIS S2Set_of_closures_id0fA6Set_of_closures_origin05tQ]%Shape0OĸT>b3Simple_value_approx0΍FU  t"0Static_exception0=m &Stdlib0y{x!O!.Stdlib__Buffer0_?K|/V>O}~Nࠠ.Stdlib__Digest0 Jjrڵ6.Stdlib__Domain0iW',P6wz.Stdlib__Either0FԤ) 4'>.Stdlib__Format0)n[-Ob/Stdlib__Hashtbl0^iaxG$+-Stdlib__Int640oTV/,Stdlib__Lazy0OM>x9