Selectgen.selector_generic
method is_immediate : Mach.integer_operation -> int -> bool
method virtual is_immediate_test : Mach.integer_comparison -> int -> bool
method virtual select_addressing : Cmm.memory_chunk ->
Cmm.expression ->
Arch.addressing_mode * Cmm.expression
method is_simple_expr : Cmm.expression -> bool
method effects_of : Cmm.expression -> Effect_and_coeffect.t
method select_operation : Cmm.operation ->
Cmm.expression list ->
Debuginfo.t ->
Mach.operation * Cmm.expression list
method select_condition : Cmm.expression -> Mach.test * Cmm.expression
method select_store : bool ->
Arch.addressing_mode ->
Cmm.expression ->
Mach.operation * Cmm.expression
method regs_for : Cmm.machtype -> Reg.t array
method insert_op : environment ->
Mach.operation ->
Reg.t array ->
Reg.t array ->
Reg.t array
method insert_op_debug : environment ->
Mach.operation ->
Debuginfo.t ->
Reg.t array ->
Reg.t array ->
Reg.t array
method insert_move_extcall_arg : environment ->
Cmm.exttype ->
Reg.t array ->
Reg.t array ->
unit
method emit_extcall_args : environment ->
Cmm.exttype list ->
Cmm.expression list ->
Reg.t array * int
method emit_stores : environment -> Cmm.expression list -> Reg.t array -> unit
method mark_instr : Mach.instruction_desc -> unit
method emit_fundecl : future_funcnames:Misc.Stdlib.String.Set.t ->
Cmm.fundecl ->
Mach.fundecl
method extract_onto : Mach.instruction -> Mach.instruction
method extract : Mach.instruction
method insert : environment ->
Mach.instruction_desc ->
Reg.t array ->
Reg.t array ->
unit
method insert_debug : environment ->
Mach.instruction_desc ->
Debuginfo.t ->
Reg.t array ->
Reg.t array ->
unit
method insert_move : environment -> Reg.t -> Reg.t -> unit
method insert_move_args : environment ->
Reg.t array ->
Reg.t array ->
int ->
unit
method insert_move_results : environment ->
Reg.t array ->
Reg.t array ->
int ->
unit
method insert_moves : environment -> Reg.t array -> Reg.t array -> unit
method emit_expr : environment -> Cmm.expression -> Reg.t array option
method emit_tail : environment -> Cmm.expression -> unit
val contains_calls : bool ref