5 Star 4 Fork 0

Gitee 极速下载 / ocaml

加入 Gitee
与超过 1200万 开发者一起发现、参与优秀开源项目,私有仓库也完全免费 :)
免费加入
此仓库是为了提升国内下载速度的镜像仓库,每日同步一次。 原始仓库: https://github.com/ocaml/ocaml/
克隆/下载
dune 7.61 KB
一键复制 编辑 原始数据 按行查看 历史
Florian Angeletti 提交于 2024-05-31 16:43 . dune: update module list
;**************************************************************************
;* *
;* OCaml *
;* *
;* Thomas Refis, Jane Street Europe *
;* *
;* Copyright 2018 Jane Street Group LLC *
;* *
;* All rights reserved. This file is distributed under the terms of *
;* the GNU Lesser General Public License version 2.1, with the *
;* special exception on linking described in the file LICENSE. *
;* *
;**************************************************************************
(env
(dev (flags (:standard -w +a-4-9-40-41-42-44-45-48-66-67-70)))
(release (flags (:standard -w +a-4-9-40-41-42-44-45-48-66-67-70))))
;; Too annoying to get to work. Use (copy_files# ...) instead
; (include_subdirs unqualified)
; (ignored_subdirs (lex yacc testsuite ocamldoc ocamltest toplevel otherlibs))
(copy_files# utils/*.ml{,i})
(copy_files# parsing/*.ml{,i})
(copy_files# typing/*.ml{,i})
(copy_files# bytecomp/*.ml{,i})
(copy_files# driver/*.ml{,i})
(copy_files# asmcomp/*.ml{,i})
(copy_files# file_formats/*.ml{,i})
(copy_files# lambda/*.ml{,i})
(copy_files# middle_end/*.ml{,i})
(copy_files# middle_end/closure/*.ml{,i})
(copy_files# middle_end/flambda/*.ml{,i})
(copy_files# middle_end/flambda/base_types/*.ml{,i})
(library
(name ocamlcommon)
(wrapped false)
(flags (:standard -principal -nostdlib \ -short-paths))
(libraries stdlib)
(modules_without_implementation
annot cmo_format outcometree parsetree value_rec_types)
(modules
;; UTILS
config build_path_prefix_map misc identifiable numbers arg_helper
clflags profile terminfo ccomp format_doc warnings consistbl
strongly_connected_components targetint load_path
int_replace_polymorphic_compare binutils local_store lazy_backtrack diffing
diffing_with_keys unit_info compression linkdeps
;; PARSING
location longident docstrings syntaxerr ast_helper camlinternalMenhirLib
ast_iterator builtin_attributes parser lexer parse printast pprintast
ast_mapper attr_helper ast_invariants depend
; manual update: mli only files
asttypes parsetree
;; TYPING
ident path primitive shape shape_reduce types btype oprint subst predef
datarepr cmi_format persistent_env env type_immediacy errortrace
typedtree printtyped ctype printtyp includeclass mtype envaux includecore
tast_iterator tast_mapper signature_group cmt_format untypeast
includemod includemod_errorprinter
typetexp patterns printpat parmatch stypes typeopt typedecl value_rec_check
typecore
typeclass typemod typedecl_variance typedecl_properties typedecl_immediacy
typedecl_unboxed typedecl_separability cmt2annot
; manual update: mli only files
annot outcometree value_rec_types
;; lambda/
debuginfo lambda matching printlambda runtimedef tmc simplif switch
translattribute translclass translcore translmod translobj translprim
value_rec_compiler
;; bytecomp/
meta opcodes bytesections dll symtable
;; some of COMP
pparse main_args compenv compmisc makedepend compile_common
; manual update: mli only files
cmo_format
; manual update: this is required.
instruct
))
(library
(name ocamlbytecomp)
(wrapped false)
(flags (:standard -principal -nostdlib))
(libraries stdlib ocamlcommon)
(modules
;; bytecomp/
bytegen bytelibrarian bytelink bytepackager emitcode printinstr
;; driver/
errors compile maindriver
))
(library
(name ocamlmiddleend)
(wrapped false)
(flags (:standard -principal -nostdlib))
(libraries stdlib ocamlcommon)
(modules_without_implementation
cmx_format cmxs_format backend_intf inlining_decision_intf
simplify_boxed_integer_ops_intf)
(modules
;; file_formats/
cmx_format cmxs_format
;; middle_end/
backend_intf backend_var backend_var clambda clambda_primitives
compilation_unit compilenv convert_primitives internal_variable_names
linkage_name printclambda printclambda_primitives semantics_of_primitives
symbol variable
;; middle_end/closure/
closure closure_middle_end
;; middle_end/flambda/base_types/
closure_element closure_id closure_origin export_id id_types mutable_variable
set_of_closures_id set_of_closures_origin static_exception tag
var_within_closure
;; middle_end/flambda/
alias_analysis allocated_const augment_specialised_args build_export_info
closure_conversion closure_conversion_aux closure_offsets effect_analysis
export_info export_info_for_pack extract_projections find_recursive_functions
flambda flambda_invariants flambda_iterators flambda_middle_end
flambda_to_clambda flambda_utils freshening import_approx inconstant_idents
initialize_symbol_to_let_symbol inline_and_simplify inline_and_simplify_aux
inlining_cost inlining_decision inlining_decision_intf inlining_stats
inlining_stats_types inlining_transforms invariant_params lift_code
lift_constants lift_let_to_initialize_symbol parameter pass_wrapper
projection ref_to_variables remove_free_vars_equal_to_args
remove_unused_arguments remove_unused_closure_vars
remove_unused_program_constructs share_constants simple_value_approx
simplify_boxed_integer_ops simplify_boxed_integer_ops_intf simplify_common
simplify_primitives traverse_for_exported_symbols un_anf unbox_closures
unbox_free_vars_of_closures unbox_specialised_args
)
)
(library
(name ocamloptcomp)
(wrapped false)
(flags (:standard -principal -nostdlib))
(libraries stdlib ocamlcommon ocamlmiddleend)
(modules_without_implementation x86_ast emitenv branch_relaxation_intf)
(modules
;; asmcomp/
afl_instrument arch asmgen asmlibrarian asmlink asmpackager branch_relaxation
branch_relaxation_intf cmm_helpers cmm cmmgen cmmgen_state coloring comballoc
cmm_invariants
CSE CSEgen
dataflow deadcode domainstate
emit emitaux emitenv
interf interval
linear linearize linscan
liveness mach
polling printcmm printlinear printmach proc
reg reload reloadgen
schedgen scheduling selectgen selection spill split
strmatch thread_sanitizer x86_ast x86_dsl x86_gas x86_masm x86_proc
stackframegen stackframe
;; file_formats/
linear_format
;; driver/
optcompile opterrors optmaindriver
)
)
;;;;;;;;;;;;;;
;;; ocamlc ;;;
;;;;;;;;;;;;;;
(executable
(name main)
(modes byte)
(flags (:standard -principal -nostdlib))
(libraries ocamlbytecomp ocamlcommon runtime stdlib)
(modules main))
(rule
(copy main.exe ocamlc.byte))
;;;;;;;;;;;;;;;;
;;; ocamlopt ;;;
;;;;;;;;;;;;;;;;
(executable
(name optmain)
(modes byte)
(flags (:standard -principal -nostdlib))
(libraries ocamloptcomp ocamlmiddleend ocamlcommon runtime stdlib)
(modules optmain))
(rule
(copy optmain.exe ocamlopt.byte))
;;;;;;;;;;;;;;;
;;; aliases ;;;
;;;;;;;;;;;;;;;
; mshinwell: The debugger and ocamldoc are currently disabled as Dynlink is
; not built correctly.
(alias
(name world)
(deps ocamlc.byte
ocamlopt.byte
; debugger/ocamldebug.byte
; ocamldoc/ocamldoc.byte
ocamltest/ocamltest.byte
toplevel/ocaml.byte
toplevel/expunge.exe
))
(alias
(name libs)
(deps
ocamloptcomp.cma
ocamlmiddleend.cma
ocamlcommon.cma
runtime/runtime.cma
stdlib/stdlib.cma
ocamlbytecomp.cma
ocamltest/ocamltest_core_and_plugin.cma
toplevel/ocamltoplevel.cma
))
马建仓 AI 助手
尝试更多
代码解读
代码找茬
代码优化
1
https://gitee.com/mirrors/ocaml.git
git@gitee.com:mirrors/ocaml.git
mirrors
ocaml
ocaml
trunk

搜索帮助

344bd9b3 5694891 D2dac590 5694891