diff options
author | Eduardo Julian | 2022-06-04 19:34:42 -0400 |
---|---|---|
committer | Eduardo Julian | 2022-06-04 19:34:42 -0400 |
commit | f9e33ae96aec4741385a576719786092c9e68043 (patch) | |
tree | 140057dfc054346eab721f9905f0f0fff22ad933 /stdlib/source/library/lux/tool/compiler | |
parent | 56d2835d35093e2d92c5e8a4371aa322b55e037b (diff) |
De-sigil-ification: #
Diffstat (limited to 'stdlib/source/library/lux/tool/compiler')
97 files changed, 730 insertions, 730 deletions
diff --git a/stdlib/source/library/lux/tool/compiler/default/platform.lux b/stdlib/source/library/lux/tool/compiler/default/platform.lux index 680a6a759..81653a205 100644 --- a/stdlib/source/library/lux/tool/compiler/default/platform.lux +++ b/stdlib/source/library/lux/tool/compiler/default/platform.lux @@ -131,8 +131,8 @@ sequence.list (monad.each ..monad write_artifact!) (is (Action (List Any))))) - document (# async.monad in - (document.marked? key (the [archive.#module module.#document] entry)))] + document (at async.monad in + (document.marked? key (the [archive.#module module.#document] entry)))] (is (Async (Try Any)) (|> [(|> entry (the archive.#module) @@ -222,7 +222,7 @@ _ (extension.with extender (as_expected directives))] (in []))) (///phase.result' state) - (# try.monad each product.left))) + (at try.monad each product.left))) (def: (phase_wrapper archive platform state) (All (_ <type_vars>) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux.lux b/stdlib/source/library/lux/tool/compiler/language/lux.lux index b5feed723..754b9321f 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux.lux @@ -96,7 +96,7 @@ ... #imports (<binary>.list <binary>.text) ... #module_state - (# <>.monad in {.#Cached})))) + (at <>.monad in {.#Cached})))) (def: .public key (Key .Module) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/analysis.lux b/stdlib/source/library/lux/tool/compiler/language/lux/analysis.lux index 0c8e86526..7274cbe00 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/analysis.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/analysis.lux @@ -76,8 +76,8 @@ (-> (Equivalence Analysis) (Equivalence Branch)) (def: (= [reference_pattern reference_body] [sample_pattern sample_body]) - (and (# /pattern.equivalence = reference_pattern sample_pattern) - (# equivalence = reference_body sample_body)))) + (and (at /pattern.equivalence = reference_pattern sample_pattern) + (at equivalence = reference_body sample_body)))) (implementation: .public equivalence (Equivalence Analysis) @@ -85,23 +85,23 @@ (def: (= reference sample) (.case [reference sample] [{#Simple reference} {#Simple sample}] - (# /simple.equivalence = reference sample) + (at /simple.equivalence = reference sample) [{#Structure reference} {#Structure sample}] - (# (/complex.equivalence =) = reference sample) + (at (/complex.equivalence =) = reference sample) [{#Reference reference} {#Reference sample}] - (# reference.equivalence = reference sample) + (at reference.equivalence = reference sample) [{#Case [reference_analysis reference_match]} {#Case [sample_analysis sample_match]}] (and (= reference_analysis sample_analysis) - (# (list.equivalence (branch_equivalence =)) = {.#Item reference_match} {.#Item sample_match})) + (at (list.equivalence (branch_equivalence =)) = {.#Item reference_match} {.#Item sample_match})) [{#Function [reference_environment reference_analysis]} {#Function [sample_environment sample_analysis]}] (and (= reference_analysis sample_analysis) - (# (list.equivalence =) = reference_environment sample_environment)) + (at (list.equivalence =) = reference_environment sample_environment)) [{#Apply [reference_input reference_abstraction]} {#Apply [sample_input sample_abstraction]}] @@ -109,7 +109,7 @@ (= reference_abstraction sample_abstraction)) [{#Extension reference} {#Extension sample}] - (# (extension.equivalence =) = reference sample) + (at (extension.equivalence =) = reference sample) _ false))) @@ -308,7 +308,7 @@ (def: .public (assertion exception parameters condition) (All (_ e) (-> (Exception e) e Bit (Operation Any))) (if condition - (# phase.monad in []) + (at phase.monad in []) (..except exception parameters))) (def: .public (with_exception exception message action) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/analysis/complex.lux b/stdlib/source/library/lux/tool/compiler/language/lux/analysis/complex.lux index 65c8db0cb..8727b6852 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/analysis/complex.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/analysis/complex.lux @@ -61,7 +61,7 @@ (/#= reference_value sample_value)) [{#Tuple reference} {#Tuple sample}] - (# (list.equivalence /#=) = reference sample) + (at (list.equivalence /#=) = reference sample) _ false))) @@ -70,19 +70,19 @@ (All (_ a) (-> (Hash a) (Hash (Complex a)))) (def: equivalence - (..equivalence (# super equivalence))) + (..equivalence (at super equivalence))) (def: (hash value) (case value {#Variant [lefts right? value]} (all n.* 2 - (# n.hash hash lefts) - (# bit.hash hash right?) - (# super hash value)) + (at n.hash hash lefts) + (at bit.hash hash right?) + (at super hash value)) {#Tuple members} (all n.* 3 - (# (list.hash super) hash members)) + (at (list.hash super) hash members)) ))) (def: .public (format %it it) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/analysis/coverage.lux b/stdlib/source/library/lux/tool/compiler/language/lux/analysis/coverage.lux index 4573ad571..b4b554a4f 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/analysis/coverage.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/analysis/coverage.lux @@ -100,8 +100,8 @@ [#Text]) [{#Variant allR casesR} {#Variant allS casesS}] - (and (# (maybe.equivalence n.equivalence) = allR allS) - (# (dictionary.equivalence =) = casesR casesS)) + (and (at (maybe.equivalence n.equivalence) = allR allS) + (at (dictionary.equivalence =) = casesR casesS)) [{#Seq leftR rightR} {#Seq leftS rightS}] (and (= leftR leftS) @@ -298,7 +298,7 @@ (n.> so_far_cases (..minimum addition'))))) (exception.except ..variant_mismatch [so_far_cases addition_cases]) - (# (dictionary.equivalence ..equivalence) = casesSF casesA) + (at (dictionary.equivalence ..equivalence) = casesSF casesA) <redundancy> ... else diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/analysis/inference.lux b/stdlib/source/library/lux/tool/compiler/language/lux/analysis/inference.lux index 7ac9ebff8..1baaf5e1d 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/analysis/inference.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/analysis/inference.lux @@ -181,7 +181,7 @@ ... (in (++ level)))))) ... 0 ... vars) - ... :inference:' (# ! each (type.univ_q quantifications) (check.clean vars :inference:)) + ... :inference:' (at ! each (type.univ_q quantifications) (check.clean vars :inference:)) ... _ (check.with just_before)] ... (in :inference:'))) ... _ (/type.inference :inference:)] diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/analysis/pattern.lux b/stdlib/source/library/lux/tool/compiler/language/lux/analysis/pattern.lux index 45fe43d56..a462e62d1 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/analysis/pattern.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/analysis/pattern.lux @@ -29,10 +29,10 @@ (def: (= reference sample) (case [reference sample] [{#Simple reference} {#Simple sample}] - (# //simple.equivalence = reference sample) + (at //simple.equivalence = reference sample) [{#Complex reference} {#Complex sample}] - (# (//complex.equivalence =) = reference sample) + (at (//complex.equivalence =) = reference sample) [{#Bind reference} {#Bind sample}] (n.= reference sample) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/generation.lux b/stdlib/source/library/lux/tool/compiler/language/lux/generation.lux index 1499d8081..42ad80162 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/generation.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/generation.lux @@ -190,7 +190,7 @@ (def: .public (symbol prefix) (All (_ anchor expression directive) (-> Text (Operation anchor expression directive Text))) - (# phase.monad each (|>> %.nat (format prefix)) ..next)) + (at phase.monad each (|>> %.nat (format prefix)) ..next)) (def: .public (enter_module module) (All (_ anchor expression directive) @@ -206,7 +206,7 @@ (All (_ anchor expression directive) (-> unit.ID [(Maybe unit.ID) expression] (Operation anchor expression directive Any))) (function (_ (^.let state+ [bundle state])) - (case (# (the #host state) evaluate label code) + (case (at (the #host state) evaluate label code) {try.#Success output} {try.#Success [state+ output]} @@ -217,7 +217,7 @@ (All (_ anchor expression directive) (-> directive (Operation anchor expression directive Any))) (function (_ (^.let state+ [bundle state])) - (case (# (the #host state) execute code) + (case (at (the #host state) execute code) {try.#Success output} {try.#Success [state+ output]} @@ -228,7 +228,7 @@ (All (_ anchor expression directive) (-> unit.ID (Maybe Text) [(Maybe unit.ID) expression] (Operation anchor expression directive [Text Any directive]))) (function (_ (^.let stateE [bundle state])) - (case (# (the #host state) define context custom code) + (case (at (the #host state) define context custom code) {try.#Success output} {try.#Success [stateE output]} diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/analysis/case.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/analysis/case.lux index 70dd51a99..bb9d617f6 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/analysis/case.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/analysis/case.lux @@ -144,10 +144,10 @@ (list#each (..quantified envs)) type.tuple [(list)] - (# check.monad in)) + (at check.monad in)) _ - (# check.monad in [(list) (..quantified envs :it:)])))) + (at check.monad in [(list) (..quantified envs :it:)])))) (def: (simple_pattern_analysis type :input: location output next) (All (_ a) (-> Type Type Location Pattern (Operation a) (Operation [Pattern a]))) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/analysis/complex.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/analysis/complex.lux index eeb30664f..7e33dfdd9 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/analysis/complex.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/analysis/complex.lux @@ -110,7 +110,7 @@ (case expectedT {.#Sum _} (|> (analyse archive valueC) - (# ! each (|>> [lefts right?] /.variant)) + (at ! each (|>> [lefts right?] /.variant)) (/type.expecting (|> expectedT type.flat_variant (list.item tag) @@ -191,23 +191,23 @@ (def: (typed_product analyse expectedT archive members) (-> Phase Type Archive (List Code) (Operation Analysis)) (<| (let [! ///.monad]) - (# ! each (|>> /.tuple)) + (at ! each (|>> /.tuple)) (is (Operation (List Analysis))) (loop (again [membersT+ (type.flat_tuple expectedT) membersC+ members]) (case [membersT+ membersC+] [{.#Item memberT {.#End}} {.#Item memberC {.#End}}] - (<| (# ! each (|>> list)) + (<| (at ! each (|>> list)) (/type.expecting memberT) (analyse archive memberC)) [{.#Item memberT {.#End}} _] (<| (/type.expecting memberT) - (# ! each (|>> list) (analyse archive (code.tuple membersC+)))) + (at ! each (|>> list) (analyse archive (code.tuple membersC+)))) [_ {.#Item memberC {.#End}}] (<| (/type.expecting (type.tuple membersT+)) - (# ! each (|>> list) (analyse archive memberC))) + (at ! each (|>> list) (analyse archive memberC))) [{.#Item memberT membersT+'} {.#Item memberC membersC+'}] (do ! @@ -316,9 +316,9 @@ (def: (local_binding? name) (-> Text (Meta Bit)) - (# meta.monad each - (list.any? (list.any? (|>> product.left (text#= name)))) - meta.locals)) + (at meta.monad each + (list.any? (list.any? (|>> product.left (text#= name)))) + meta.locals)) ... Lux already possesses the means to analyse tuples, so ... re-implementing the same functionality for records makes no sense. diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/analysis/function.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/analysis/function.lux index 19e415b29..b0e6131e4 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/analysis/function.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/analysis/function.lux @@ -61,10 +61,10 @@ (/.with_exception ..cannot_analyse [expectedT function_name arg_name body] (case expectedT {.#Function :input: :output:} - (<| (# ! each (.function (_ [scope bodyA]) - {/.#Function (list#each (|>> /.variable) - (/scope.environment scope)) - bodyA})) + (<| (at ! each (.function (_ [scope bodyA]) + {/.#Function (list#each (|>> /.variable) + (/scope.environment scope)) + bodyA})) /scope.with ... Functions have access not only to their argument, but ... also to themselves, through a local variable. diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/directive.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/directive.lux index be4a0fd6f..c72e90e51 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/directive.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/directive.lux @@ -116,7 +116,7 @@ (case expansion (pattern (partial_list <lux_def_module> referrals)) (|> (again archive <lux_def_module>) - (# ! each (revised /.#referrals (list#composite referrals)))) + (at ! each (revised /.#referrals (list#composite referrals)))) _ (..requiring again archive expansion))) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/analysis/jvm.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/analysis/jvm.lux index b7feef155..2d0bee2fc 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/analysis/jvm.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/analysis/jvm.lux @@ -621,8 +621,8 @@ (text.starts_with? descriptor.array_prefix name) (let [[_ unprefixed] (maybe.trusted (text.split_by descriptor.array_prefix name))] - (# phase.monad each jvm.array - (check_jvm {.#Primitive unprefixed (list)}))) + (at phase.monad each jvm.array + (check_jvm {.#Primitive unprefixed (list)}))) ... else (phase#in (jvm.class name (list))))) @@ -961,7 +961,7 @@ (monad.each phase.monad (function (_ superT) (do [! phase.monad] - [super_name (# ! each ..reflection (check_jvm superT)) + [super_name (at ! each ..reflection (check_jvm superT)) super_class (phase.lifted (reflection!.load class_loader super_name))] (in [[super_name superT] (java/lang/Class::isAssignableFrom super_class target_class)]))) @@ -977,10 +977,10 @@ (pattern (list fromC)) (do [! phase.monad] [toT (///.lifted meta.expected_type) - target_name (# ! each ..reflection (check_jvm toT)) + target_name (at ! each ..reflection (check_jvm toT)) [fromT fromA] (typeA.inferring (analyse archive fromC)) - source_name (# ! each ..reflection (check_jvm fromT)) + source_name (at ! each ..reflection (check_jvm fromT)) can_cast? (is (Operation Bit) (`` (cond (~~ (template [<primitive> <object>] [(let [=primitive (reflection.reflection <primitive>)] @@ -1440,10 +1440,10 @@ aliasing (dictionary.composite (..aliasing expected_class_tvars actual_class_tvars) (..aliasing expected_method_tvars actual_method_tvars))] passes? (check_method aliasing class method_name method_style inputsJT method)] - (# ! each (if passes? - (|>> {#Pass}) - (|>> {#Hint})) - (method_signature method_style method)))))))] + (at ! each (if passes? + (|>> {#Pass}) + (|>> {#Hint})) + (method_signature method_style method)))))))] (case (list.all pass candidates) {.#Item method {.#End}} (in method) @@ -1473,11 +1473,11 @@ aliasing (dictionary.composite (..aliasing expected_class_tvars actual_class_tvars) (..aliasing expected_method_tvars actual_method_tvars))] passes? (check_constructor aliasing class inputsJT constructor)] - (# ! each - (if passes? - (|>> {#Pass}) - (|>> {#Hint})) - (constructor_signature constructor))))))] + (at ! each + (if passes? + (|>> {#Pass}) + (|>> {#Hint})) + (constructor_signature constructor))))))] (case (list.all pass candidates) {.#Item constructor {.#End}} (in constructor) @@ -2187,7 +2187,7 @@ phase.lifted)] (|> super_parameters (monad.each ! (..reflection_type mapping)) - (# ! each (|>> (list.zipped_2 parent_parameters))))) + (at ! each (|>> (list.zipped_2 parent_parameters))))) (phase.lifted (exception.except ..mismatched_super_parameters [parent_name expected_count actual_count])))) {.#None} @@ -2284,7 +2284,7 @@ (def: (matched? [sub sub_method subJT] [super super_method superJT]) (-> [(Type Class) Text (Type Method)] [(Type Class) Text (Type Method)] Bit) - (and (# descriptor.equivalence = (jvm.descriptor super) (jvm.descriptor sub)) + (and (at descriptor.equivalence = (jvm.descriptor super) (jvm.descriptor sub)) (text#= super_method sub_method) (jvm#= superJT subJT))) @@ -2465,13 +2465,13 @@ _.aconst_null {.#Right primitiveT} - (cond (# jvm.equivalence = jvm.long primitiveT) + (cond (at jvm.equivalence = jvm.long primitiveT) _.lconst_0 - (# jvm.equivalence = jvm.float primitiveT) + (at jvm.equivalence = jvm.float primitiveT) _.fconst_0 - (# jvm.equivalence = jvm.double primitiveT) + (at jvm.equivalence = jvm.double primitiveT) _.dconst_0 ... jvm.boolean jvm.byte jvm.short jvm.int jvm.char @@ -2491,13 +2491,13 @@ _.areturn {.#Right primitiveT} - (cond (# jvm.equivalence = jvm.long primitiveT) + (cond (at jvm.equivalence = jvm.long primitiveT) _.lreturn - (# jvm.equivalence = jvm.float primitiveT) + (at jvm.equivalence = jvm.float primitiveT) _.freturn - (# jvm.equivalence = jvm.double primitiveT) + (at jvm.equivalence = jvm.double primitiveT) _.dreturn ... jvm.boolean jvm.byte jvm.short jvm.int jvm.char @@ -2622,7 +2622,7 @@ (list) (list#each (|>> {#Overriden_Method}) methods))) ... Necessary for reflection to work properly during analysis. - _ (phase.lifted (# host execute mock)) + _ (phase.lifted (at host execute mock)) mapping (typeA.check (..class_mapping parameters)) super_classT (typeA.check (luxT.check (luxT.class mapping) (..signature super_class))) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/analysis/lux.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/analysis/lux.lux index 76f36e336..2a5ad85ad 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/analysis/lux.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/analysis/lux.lux @@ -145,7 +145,7 @@ (|> opC (analyse archive) (typeA.expecting (type (-> .Any :var:))) - (# ! each (|>> list {////analysis.#Extension extension_name}))))) + (at ! each (|>> list {////analysis.#Extension extension_name}))))) _ (////analysis.except ///.incorrect_arity [extension_name 1 (list.size args)])))) @@ -167,8 +167,8 @@ (case args (pattern (list typeC valueC)) (do [! ////.monad] - [actualT (# ! each (|>> (as Type)) - (eval archive Type typeC)) + [actualT (at ! each (|>> (as Type)) + (eval archive Type typeC)) _ (typeA.inference actualT)] (<| (typeA.expecting actualT) (analyse archive valueC))) @@ -182,8 +182,8 @@ (case args (pattern (list typeC valueC)) (do [! ////.monad] - [actualT (# ! each (|>> (as Type)) - (eval archive Type typeC)) + [actualT (at ! each (|>> (as Type)) + (eval archive Type typeC)) _ (typeA.inference actualT) [valueT valueA] (typeA.inferring (analyse archive valueC))] diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/directive/jvm.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/directive/jvm.lux index 025e863d3..5158193ae 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/directive/jvm.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/directive/jvm.lux @@ -431,7 +431,7 @@ (value.wrap <type>) (_.astore lux_register))]]] (`` (cond (~~ (template [<shift> <load> <type>] - [(# type.equivalence = <type> argumentT) + [(at type.equivalence = <type> argumentT) (wrap_primitive <shift> <load> <type>)] [1 _.iload type.boolean] @@ -442,7 +442,7 @@ [1 _.fload type.float] [2 _.lload type.long])) - ... (# type.equivalence = type.double argumentT) + ... (at type.equivalence = type.double argumentT) (wrap_primitive 2 _.dload type.double)))))) (def: .public (method_arguments offset types) @@ -514,7 +514,7 @@ (value.unwrap <type>) <return>)]] (`` (cond (~~ (template [<return> <type>] - [(# type.equivalence = <type> returnT) + [(at type.equivalence = <type> returnT) (unwrap_primitive <return> <type>)] [_.ireturn type.boolean] @@ -525,7 +525,7 @@ [_.freturn type.float] [_.lreturn type.long])) - ... (# type.equivalence = type.double returnT) + ... (at type.equivalence = type.double returnT) (unwrap_primitive _.dreturn type.double))))))) (def: (overriden_method_generation archive method) @@ -632,7 +632,7 @@ (..static_method_generation archive method) {#Abstract_Method method} - (# phase.monad in (..abstract_method_generation method)))) + (at phase.monad in (..abstract_method_generation method)))) (def: (method_definition archive super interfaces [mapping selfT] [analyse synthesize generate]) (-> Archive @@ -705,13 +705,13 @@ _.aconst_null {.#Right primitiveT} - (cond (# type.equivalence = type.long primitiveT) + (cond (at type.equivalence = type.long primitiveT) _.lconst_0 - (# type.equivalence = type.float primitiveT) + (at type.equivalence = type.float primitiveT) _.fconst_0 - (# type.equivalence = type.double primitiveT) + (at type.equivalence = type.double primitiveT) _.dconst_0 ... type.boolean type.byte type.short type.int type.char @@ -731,13 +731,13 @@ _.areturn {.#Right primitiveT} - (cond (# type.equivalence = type.long primitiveT) + (cond (at type.equivalence = type.long primitiveT) _.lreturn - (# type.equivalence = type.float primitiveT) + (at type.equivalence = type.float primitiveT) _.freturn - (# type.equivalence = type.double primitiveT) + (at type.equivalence = type.double primitiveT) _.dreturn ... type.boolean type.byte type.short type.int type.char @@ -901,7 +901,7 @@ (the [directive.#generation directive.#phase] state)]) methods) .let [all_dependencies (cache.all (list#each product.left methods))] - bytecode (<| (# ! each (format.result class.writer)) + bytecode (<| (at ! each (format.result class.writer)) phase.lifted (class.class version.v6_0 (all modifier#composite @@ -940,7 +940,7 @@ (function (_ extension_name phase archive [[name parameters] supers annotations method_declarations]) (directive.lifted_generation (do [! phase.monad] - [bytecode (<| (# ! each (format.result class.writer)) + [bytecode (<| (at ! each (format.result class.writer)) phase.lifted (class.class version.v6_0 (all modifier#composite diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/common_lisp/common.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/common_lisp/common.lux index 355dd5182..111d1d4aa 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/common_lisp/common.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/common_lisp/common.lux @@ -64,7 +64,7 @@ ... <s>.any)))) ... (function (_ extension_name phase archive [input else conditionals]) ... (do [! /////.monad] -... [@input (# ! each _.var (generation.symbol "input")) +... [@input (at ! each _.var (generation.symbol "input")) ... inputG (phase archive input) ... elseG (phase archive else) ... conditionalsG (is (Operation (List [Expression Expression])) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/js/common.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/js/common.lux index f9ad9a81e..db527fbd2 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/js/common.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/js/common.lux @@ -57,10 +57,10 @@ (template [<name> <op>] [(def: (<name> [paramG subjectG]) (Binary Expression) - (<op> subjectG (//runtime.i64##number paramG)))] + (<op> subjectG (//runtime.i64::number paramG)))] - [i64##left_shifted //runtime.i64##left_shifted] - [i64##right_shifted //runtime.i64##right_shifted] + [i64::left_shifted //runtime.i64::left_shifted] + [i64::right_shifted //runtime.i64::right_shifted] ) ... [[Numbers]] @@ -72,9 +72,9 @@ (_.closure (list)) //runtime.lux//try)) -(def: i64##char +(def: i64::char (Unary Expression) - (|>> //runtime.i64##number + (|>> //runtime.i64::number (list) (_.apply (_.var "String.fromCharCode")))) @@ -190,20 +190,20 @@ Bundle (<| (/.prefix "i64") (|> /.empty - (/.install "and" (binary (product.uncurried //runtime.i64##and))) - (/.install "or" (binary (product.uncurried //runtime.i64##or))) - (/.install "xor" (binary (product.uncurried //runtime.i64##xor))) - (/.install "left-shift" (binary i64##left_shifted)) - (/.install "right-shift" (binary i64##right_shifted)) - (/.install "=" (binary (product.uncurried //runtime.i64##=))) - (/.install "<" (binary (product.uncurried //runtime.i64##<))) - (/.install "+" (binary (product.uncurried //runtime.i64##+))) - (/.install "-" (binary (product.uncurried //runtime.i64##-))) - (/.install "*" (binary (product.uncurried //runtime.i64##*))) - (/.install "/" (binary (product.uncurried //runtime.i64##/))) - (/.install "%" (binary (product.uncurried //runtime.i64##%))) - (/.install "f64" (unary //runtime.i64##number)) - (/.install "char" (unary i64##char)) + (/.install "and" (binary (product.uncurried //runtime.i64::and))) + (/.install "or" (binary (product.uncurried //runtime.i64::or))) + (/.install "xor" (binary (product.uncurried //runtime.i64::xor))) + (/.install "left-shift" (binary i64::left_shifted)) + (/.install "right-shift" (binary i64::right_shifted)) + (/.install "=" (binary (product.uncurried //runtime.i64::=))) + (/.install "<" (binary (product.uncurried //runtime.i64::<))) + (/.install "+" (binary (product.uncurried //runtime.i64::+))) + (/.install "-" (binary (product.uncurried //runtime.i64::-))) + (/.install "*" (binary (product.uncurried //runtime.i64::*))) + (/.install "/" (binary (product.uncurried //runtime.i64::/))) + (/.install "%" (binary (product.uncurried //runtime.i64::%))) + (/.install "f64" (unary //runtime.i64::number)) + (/.install "char" (unary i64::char)) ))) (def: f64_procs @@ -217,7 +217,7 @@ (/.install "%" (binary (product.uncurried _.%))) (/.install "=" (binary (product.uncurried _.=))) (/.install "<" (binary (product.uncurried _.<))) - (/.install "i64" (unary //runtime.i64##of_number)) + (/.install "i64" (unary //runtime.i64::of_number)) (/.install "encode" (unary (_.do "toString" (list)))) (/.install "decode" (unary f64//decode))))) @@ -229,7 +229,7 @@ (/.install "<" (binary (product.uncurried _.<))) (/.install "concat" (binary text//concat)) (/.install "index" (trinary text//index)) - (/.install "size" (unary (|>> (_.the "length") //runtime.i64##of_number))) + (/.install "size" (unary (|>> (_.the "length") //runtime.i64::of_number))) (/.install "char" (binary (product.uncurried //runtime.text//char))) (/.install "clip" (trinary text//clip)) ))) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/js/host.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/js/host.lux index 3d61566c2..44674faf0 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/js/host.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/js/host.lux @@ -36,7 +36,7 @@ (def: array::length (Unary Expression) - (|>> (_.the "length") //runtime.i64##of_number)) + (|>> (_.the "length") //runtime.i64::of_number)) (def: (array::read [indexG arrayG]) (Binary Expression) @@ -115,7 +115,7 @@ (custom [<s>.text (function (_ extension phase archive name) - (# ////////phase.monad in (_.var name)))])) + (at ////////phase.monad in (_.var name)))])) (def: js::apply (custom @@ -134,7 +134,7 @@ [abstractionG (phase archive abstractionS) .let [variable (is (-> Text (Operation Var)) (|>> generation.symbol - (# ! each _.var)))] + (at ! each _.var)))] g!inputs (monad.each ! (function (_ _) (variable "input")) (list.repeated (.nat arity) [])) g!abstraction (variable "abstraction")] diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/jvm/host.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/jvm/host.lux index 4e60e6693..d9b809f6c 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/jvm/host.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/jvm/host.lux @@ -649,7 +649,7 @@ (..custom [(all <>.and <synthesis>.text <synthesis>.text ..value) (function (_ extension_name generate archive [class field :unboxed:]) - (# //////.monad in (_.getstatic (type.class class (list)) field :unboxed:)))])) + (at //////.monad in (_.getstatic (type.class class (list)) field :unboxed:)))])) (def: unitG (_.string //////synthesis.unit)) @@ -1054,7 +1054,7 @@ (///value.unwrap <type>) <return>)]] (`` (cond (~~ (template [<return> <type>] - [(# type.equivalence = <type> returnT) + [(at type.equivalence = <type> returnT) (unwrap_primitive <return> <type>)] [_.ireturn type.boolean] @@ -1065,7 +1065,7 @@ [_.freturn type.float] [_.lreturn type.long])) - ... (# type.equivalence = type.double returnT) + ... (at type.equivalence = type.double returnT) (unwrap_primitive _.dreturn type.double))))))) (def: (method_dependencies archive method) @@ -1109,7 +1109,7 @@ (///value.wrap <type>) (_.astore lux_register))]]] (`` (cond (~~ (template [<shift> <load> <type>] - [(# type.equivalence = <type> argumentT) + [(at type.equivalence = <type> argumentT) (wrap_primitive <shift> <load> <type>)] [1 _.iload type.boolean] @@ -1120,7 +1120,7 @@ [1 _.fload type.float] [2 _.lload type.long])) - ... (# type.equivalence = type.double argumentT) + ... (at type.equivalence = type.double argumentT) (wrap_primitive 2 _.dload type.double)))))) (def: .public (prepare_arguments offset types) @@ -1222,7 +1222,7 @@ methods! (|> overriden_methods (list#each (normalized_method global_mapping)) (monad.each ! (method_definition generate archive artifact_id))) - bytecode (<| (# ! each (format.result class.writer)) + bytecode (<| (at ! each (format.result class.writer)) //////.lifted (class.class version.v6_0 (all modifier#composite class.public class.final) (name.internal anonymous_class_name) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/lua/common.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/lua/common.lux index 834d3448c..5d9753b87 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/lua/common.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/lua/common.lux @@ -138,7 +138,7 @@ {synthesis.#Then else}) [input] (//case.case! statement phase archive) - (# /////.monad each (|>> (as Expression)))))])) + (at /////.monad each (|>> (as Expression)))))])) (def: lux_procs Bundle diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/lua/host.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/lua/host.lux index c5401856a..365fbe663 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/lua/host.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/lua/host.lux @@ -137,7 +137,7 @@ (custom [<s>.text (function (_ extension phase archive name) - (# ////////phase.monad in (_.var name)))])) + (at ////////phase.monad in (_.var name)))])) (def: lua::apply (custom @@ -161,8 +161,8 @@ (custom [<s>.text (function (_ extension phase archive module) - (# ////////phase.monad in - (_.require/1 (_.string module))))])) + (at ////////phase.monad in + (_.require/1 (_.string module))))])) (def: lua::function (custom @@ -172,7 +172,7 @@ [abstractionG (phase archive abstractionS) .let [variable (is (-> Text (Operation Var)) (|>> generation.symbol - (# ! each _.var)))] + (at ! each _.var)))] g!inputs (monad.each ! (function (_ _) (variable "input")) (list.repeated (.nat arity) []))] diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/php/common.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/php/common.lux index ef05fe70f..911e63531 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/php/common.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/php/common.lux @@ -67,7 +67,7 @@ [inputG (phase archive input) [[context_module context_artifact] elseG] (generation.with_new_context archive (phase archive else)) - @input (# ! each _.var (generation.symbol "input")) + @input (at ! each _.var (generation.symbol "input")) conditionalsG (is (Operation (List [Expression Expression])) (monad.each ! (function (_ [chars branch]) (do ! diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/php/host.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/php/host.lux index a3ea6010c..073c49818 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/php/host.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/php/host.lux @@ -109,7 +109,7 @@ (custom [<s>.text (function (_ extension phase archive name) - (# ////////phase.monad in (_.constant name)))])) + (at ////////phase.monad in (_.constant name)))])) (def: php::apply (custom diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/python/common.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/python/common.lux index 22ffda36e..e48f139a3 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/python/common.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/python/common.lux @@ -113,7 +113,7 @@ (do [! /////.monad] [inputG (phase archive input) else! (..statement phase archive else) - @input (# ! each _.var (generation.symbol "input")) + @input (at ! each _.var (generation.symbol "input")) conditionals! (is (Operation (List [(Expression Any) (Statement Any)])) (monad.each ! (function (_ [chars branch]) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/python/host.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/python/host.lux index 902be185c..0b00fd778 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/python/host.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/python/host.lux @@ -134,7 +134,7 @@ [abstractionG (phase archive abstractionS) .let [variable (is (-> Text (Operation SVar)) (|>> generation.symbol - (# ! each _.var)))] + (at ! each _.var)))] g!inputs (monad.each ! (function (_ _) (variable "input")) (list.repeated (.nat arity) []))] (in (_.lambda g!inputs diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/r/common.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/r/common.lux index 35e433e8e..8f1a0c53e 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/r/common.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/r/common.lux @@ -64,7 +64,7 @@ ... ... <s>.any)))) ... ... (function (_ extension_name phase archive [input else conditionals]) ... ... (do [! /////.monad] -... ... [@input (# ! each _.var (generation.symbol "input")) +... ... [@input (at ! each _.var (generation.symbol "input")) ... ... inputG (phase archive input) ... ... elseG (phase archive else) ... ... conditionalsG (is (Operation (List [Expression Expression])) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/ruby/common.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/ruby/common.lux index e7395899b..bee06eb6a 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/ruby/common.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/ruby/common.lux @@ -112,7 +112,7 @@ (do [! /////.monad] [inputG (phase archive input) else! (statement phase archive else) - @input (# ! each _.local (generation.symbol "input")) + @input (at ! each _.local (generation.symbol "input")) conditionals! (is (Operation (List [Expression Statement])) (monad.each ! (function (_ [chars branch]) (do ! @@ -154,23 +154,23 @@ Bundle (<| (/.prefix "i64") (|> /.empty - (/.install "and" (binary (product.uncurried //runtime.i64##and))) - (/.install "or" (binary (product.uncurried //runtime.i64##or))) - (/.install "xor" (binary (product.uncurried //runtime.i64##xor))) - (/.install "left-shift" (binary (product.uncurried //runtime.i64##left_shifted))) - (/.install "right-shift" (binary (product.uncurried //runtime.i64##right_shifted))) + (/.install "and" (binary (product.uncurried //runtime.i64::and))) + (/.install "or" (binary (product.uncurried //runtime.i64::or))) + (/.install "xor" (binary (product.uncurried //runtime.i64::xor))) + (/.install "left-shift" (binary (product.uncurried //runtime.i64::left_shifted))) + (/.install "right-shift" (binary (product.uncurried //runtime.i64::right_shifted))) (/.install "<" (binary (product.uncurried _.<))) (/.install "=" (binary (product.uncurried _.=))) - (/.install "+" (binary (product.uncurried //runtime.i64##+))) - (/.install "-" (binary (product.uncurried //runtime.i64##-))) - (/.install "*" (binary (product.uncurried //runtime.i64##*))) - (/.install "/" (binary (product.uncurried //runtime.i64##/))) + (/.install "+" (binary (product.uncurried //runtime.i64::+))) + (/.install "-" (binary (product.uncurried //runtime.i64::-))) + (/.install "*" (binary (product.uncurried //runtime.i64::*))) + (/.install "/" (binary (product.uncurried //runtime.i64::/))) (/.install "%" (binary (function (_ [parameter subject]) (_.do "remainder" (list parameter) {.#None} subject)))) (/.install "f64" (unary (_./ (_.float +1.0)))) - (/.install "char" (unary //runtime.i64##char)) + (/.install "char" (unary //runtime.i64::char)) ))) (def: f64_procs diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/ruby/host.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/ruby/host.lux index 803de7582..4895535d5 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/ruby/host.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/ruby/host.lux @@ -104,7 +104,7 @@ (custom [<s>.text (function (_ extension phase archive name) - (# ////////phase.monad in (is _.CVar (_.manual name))))])) + (at ////////phase.monad in (is _.CVar (_.manual name))))])) (def: ruby::apply (custom @@ -119,8 +119,8 @@ (custom [<s>.text (function (_ extension phase archive module) - (# ////////phase.monad in - (_.require/1 (_.string module))))])) + (at ////////phase.monad in + (_.require/1 (_.string module))))])) (def: .public bundle Bundle diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/scheme/common.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/scheme/common.lux index 9dbea2892..a3235673f 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/scheme/common.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/extension/generation/scheme/common.lux @@ -64,7 +64,7 @@ <s>.any)))) (function (_ extension_name phase archive [input else conditionals]) (do [! /////.monad] - [@input (# ! each _.var (generation.symbol "input")) + [@input (at ! each _.var (generation.symbol "input")) inputG (phase archive input) elseG (phase archive else) conditionalsG (is (Operation (List [Expression Expression])) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/common_lisp/case.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/common_lisp/case.lux index 7a5c774c4..3a94f56d6 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/common_lisp/case.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/common_lisp/case.lux @@ -143,11 +143,11 @@ (function (again [$output @done @fail pathP]) (.case pathP (pattern (/////synthesis.path/then bodyS)) - (# ///////phase.monad each - (function (_ outputV) - (_.progn (list (_.setq $output outputV) - (_.go @done)))) - (expression archive bodyS)) + (at ///////phase.monad each + (function (_ outputV) + (_.progn (list (_.setq $output outputV) + (_.go @done)))) + (expression archive bodyS)) {/////synthesis.#Pop} (///////phase#in ..pop!) @@ -197,7 +197,7 @@ (pattern (<simple> idx nextP)) (|> nextP [$output @done @fail] again - (# ///////phase.monad each (|>> {.#Some} (<choice> @fail true idx))))]) + (at ///////phase.monad each (|>> {.#Some} (<choice> @fail true idx))))]) ([/////synthesis.side/left /////synthesis.simple_left_side ..left_choice] [/////synthesis.side/right /////synthesis.simple_right_side ..right_choice]) @@ -219,7 +219,7 @@ (pattern (/////synthesis.path/alt preP postP)) (do [! ///////phase.monad] - [@otherwise (# ! each (|>> %.nat (format "lux_case_otherwise") _.tag) /////generation.next) + [@otherwise (at ! each (|>> %.nat (format "lux_case_otherwise") _.tag) /////generation.next) pre! (again [$output @done @otherwise preP]) post! (again [$output @done @fail postP])] (in (..alternation @otherwise pre! post!))) @@ -233,8 +233,8 @@ (def: (pattern_matching $output expression archive pathP) (-> Var/1 (Generator Path)) (do [! ///////phase.monad] - [@done (# ! each (|>> %.nat (format "lux_case_done") _.tag) /////generation.next) - @fail (# ! each (|>> %.nat (format "lux_case_fail") _.tag) /////generation.next) + [@done (at ! each (|>> %.nat (format "lux_case_done") _.tag) /////generation.next) + @fail (at ! each (|>> %.nat (format "lux_case_fail") _.tag) /////generation.next) pattern_matching! (pattern_matching' expression archive [$output @done @fail pathP])] (in (_.tagbody (list pattern_matching! @@ -246,7 +246,7 @@ (Generator [Synthesis Path]) (do [! ///////phase.monad] [initG (expression archive valueS) - $output (# ! each (|>> %.nat (format "lux_case_output") _.var) /////generation.next) + $output (at ! each (|>> %.nat (format "lux_case_output") _.var) /////generation.next) pattern_matching! (pattern_matching $output expression archive pathP) .let [storage (|> pathP ////synthesis/case.storage diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/common_lisp/function.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/common_lisp/function.lux index 77569b17e..a046cf31e 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/common_lisp/function.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/common_lisp/function.lux @@ -44,11 +44,11 @@ (-> (List (Expression Any)) (Expression Any) (Operation (Expression Any))) (case inits {.#End} - (# ///////phase.monad in function_definition) + (at ///////phase.monad in function_definition) _ (do [! ///////phase.monad] - [@closure (# ! each _.var (/////generation.symbol "closure"))] + [@closure (at ! each _.var (/////generation.symbol "closure"))] (in (_.labels (list [@closure [(|> (list.enumeration inits) (list#each (|>> product.left ..capture)) _.args) @@ -61,8 +61,8 @@ (def: .public (function expression archive [environment arity bodyS]) (Generator (Abstraction Synthesis)) (do [! ///////phase.monad] - [@scope (# ! each (|>> %.nat (format "function_scope") _.tag) /////generation.next) - @output (# ! each (|>> %.nat (format "loop_output") _.var) /////generation.next) + [@scope (at ! each (|>> %.nat (format "function_scope") _.tag) /////generation.next) + @output (at ! each (|>> %.nat (format "loop_output") _.var) /////generation.next) [function_name bodyG] (/////generation.with_new_context archive (/////generation.with_anchor [@scope 1] (expression archive bodyS))) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/common_lisp/loop.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/common_lisp/loop.lux index 287d9a6c3..619496a21 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/common_lisp/loop.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/common_lisp/loop.lux @@ -42,8 +42,8 @@ ... true loop _ (do [! ///////phase.monad] - [@scope (# ! each (|>> %.nat (format "loop_scope") _.tag) /////generation.next) - @output (# ! each (|>> %.nat (format "loop_output") _.var) /////generation.next) + [@scope (at ! each (|>> %.nat (format "loop_scope") _.tag) /////generation.next) + @output (at ! each (|>> %.nat (format "loop_output") _.var) /////generation.next) initsG+ (monad.each ! (expression archive) initsS+) bodyG (/////generation.with_anchor [@scope start] (expression archive bodyS))] diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/common_lisp/runtime.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/common_lisp/runtime.lux index e9bbd9a5c..1257c661a 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/common_lisp/runtime.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/common_lisp/runtime.lux @@ -290,4 +290,4 @@ (sequence.sequence [(%.nat ..module_id) (|> ..runtime _.code - (# encoding.utf8 encoded))])]))) + (at encoding.utf8 encoded))])]))) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/js/case.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/js/case.lux index 9afe42e0c..963d0574b 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/js/case.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/js/case.lux @@ -185,7 +185,7 @@ [(pattern (<simple> idx nextP)) (|> nextP again - (# ///////phase.monad each (|>> (_.then (<choice> true idx)) {.#Some})))]) + (at ///////phase.monad each (|>> (_.then (<choice> true idx)) {.#Some})))]) ([/////synthesis.simple_left_side ..left_choice] [/////synthesis.simple_right_side ..right_choice]) @@ -276,7 +276,7 @@ [clauses (monad.each ! (function (_ [match then]) (do ! [then! (again then)] - (in [(//runtime.i64##= (//primitive.i64 (.int match)) + (in [(//runtime.i64::= (//primitive.i64 (.int match)) ..peek_cursor) then!]))) {.#Item item})] @@ -289,7 +289,7 @@ [{<tag> item} (do [! ///////phase.monad] [cases (monad.each ! (function (_ [match then]) - (# ! each (|>> [(list (<format> match))]) (again then))) + (at ! each (|>> [(list (<format> match))]) (again then))) {.#Item item})] (in (_.switch ..peek_cursor cases diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/js/function.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/js/function.lux index 69b575162..ff96c9fe7 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/js/function.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/js/function.lux @@ -77,8 +77,8 @@ [dependencies (cache.dependencies archive bodyS) [function_name body!] (/////generation.with_new_context archive dependencies (do ! - [scope (# ! each ..@scope - (/////generation.context archive))] + [scope (at ! each ..@scope + (/////generation.context archive))] (/////generation.with_anchor [1 scope] (statement expression archive bodyS)))) .let [arityO (|> arity .int _.i32) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/js/loop.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/js/loop.lux index 9849f3981..929b2a2e0 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/js/loop.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/js/loop.lux @@ -70,11 +70,11 @@ ... true loop _ (do [! ///////phase.monad] - [@scope (# ! each ..@scope /////generation.next) + [@scope (at ! each ..@scope /////generation.next) initsO+ (monad.each ! (expression archive) initsS+) body! (/////generation.with_anchor [start @scope] (statement expression archive bodyS)) - $iteration (# ! each ..$iteration /////generation.next)] + $iteration (at ! each ..$iteration /////generation.next)] (in (..setup $iteration true start initsO+ @@ -103,7 +103,7 @@ (do [! ///////phase.monad] [[offset @scope] /////generation.anchor argsO+ (monad.each ! (expression archive) argsS+) - $iteration (# ! each ..$iteration /////generation.next)] + $iteration (at ! each ..$iteration /////generation.next)] (in (all _.then (_.define @temp (_.array argsO+)) (..setup $iteration diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/js/runtime.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/js/runtime.lux index 12359b713..532f3c826 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/js/runtime.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/js/runtime.lux @@ -186,32 +186,32 @@ (-> Expression Expression Expression Computation) (_.new ..variant//new (list tag last? value))) -(runtime: (sum//get sum expected##right? expected##lefts) +(runtime: (sum//get sum expected::right? expected::lefts) (let [mismatch! (_.return _.null) - actual##lefts (|> sum (_.the ..variant_tag_field)) - actual##right? (|> sum (_.the ..variant_flag_field)) - actual##value (|> sum (_.the ..variant_value_field)) - is_last? (_.= ..unit actual##right?) + actual::lefts (|> sum (_.the ..variant_tag_field)) + actual::right? (|> sum (_.the ..variant_flag_field)) + actual::value (|> sum (_.the ..variant_value_field)) + is_last? (_.= ..unit actual::right?) recur! (all _.then - (_.set expected##lefts (|> expected##lefts - (_.- actual##lefts) + (_.set expected::lefts (|> expected::lefts + (_.- actual::lefts) (_.- (_.i32 +1)))) - (_.set sum actual##value))] + (_.set sum actual::value))] (<| (_.while (_.boolean true)) - (_.if (_.= expected##lefts actual##lefts) - (_.if (_.= expected##right? actual##right?) - (_.return actual##value) + (_.if (_.= expected::lefts actual::lefts) + (_.if (_.= expected::right? actual::right?) + (_.return actual::value) mismatch!)) - (_.if (_.< expected##lefts actual##lefts) - (_.if (_.= ..unit actual##right?) + (_.if (_.< expected::lefts actual::lefts) + (_.if (_.= ..unit actual::right?) recur! mismatch!)) - (_.if (_.= ..unit expected##right?) - (_.return (..variant (|> actual##lefts - (_.- expected##lefts) + (_.if (_.= ..unit expected::right?) + (_.return (..variant (|> actual::lefts + (_.- expected::lefts) (_.- (_.i32 +1))) - actual##right? - actual##value))) + actual::right? + actual::value))) mismatch!))) (def: left @@ -266,7 +266,7 @@ (def: .public i64_low_field Text "_lux_low") (def: .public i64_high_field Text "_lux_high") -(runtime: i64##new +(runtime: i64::new (let [@this (_.var "this")] (with_vars [high low] (_.closure (list high low) @@ -277,7 +277,7 @@ (def: .public (i64 high low) (-> Expression Expression Computation) - (_.new ..i64##new (list high low))) + (_.new ..i64::new (list high low))) (template [<name> <op>] [(runtime: (<name> subject parameter) @@ -286,12 +286,12 @@ (<op> (_.the ..i64_low_field subject) (_.the ..i64_low_field parameter)))))] - [i64##xor _.bit_xor] - [i64##or _.bit_or] - [i64##and _.bit_and] + [i64::xor _.bit_xor] + [i64::or _.bit_or] + [i64::and _.bit_and] ) -(runtime: (i64##not value) +(runtime: (i64::not value) (_.return (..i64 (_.bit_not (_.the ..i64_high_field value)) (_.bit_not (_.the ..i64_low_field value))))) @@ -308,7 +308,7 @@ (-> Var Expression) (|>> (_.< (_.i32 +32)))) -(runtime: (i64##left_shifted input shift) +(runtime: (i64::left_shifted input shift) (all _.then (..cap_shift! shift) (_.return (<| (..no_shift! shift input) @@ -321,7 +321,7 @@ (..i64 high (_.i32 +0))))) )) -(runtime: (i64##arithmetic_right_shifted input shift) +(runtime: (i64::arithmetic_right_shifted input shift) (all _.then (..cap_shift! shift) (_.return (<| (..no_shift! shift input) @@ -336,7 +336,7 @@ low (|> input (_.the ..i64_high_field) (_.arithmetic_right_shift (_.- (_.i32 +32) shift)))] (..i64 high low)))))) -(runtime: (i64##right_shifted input shift) +(runtime: (i64::right_shifted input shift) (all _.then (..cap_shift! shift) (_.return (<| (..no_shift! shift input) @@ -353,59 +353,59 @@ (def: runtime//bit Statement (all _.then - @i64##and - @i64##or - @i64##xor - @i64##not - @i64##left_shifted - @i64##arithmetic_right_shifted - @i64##right_shifted + @i64::and + @i64::or + @i64::xor + @i64::not + @i64::left_shifted + @i64::arithmetic_right_shifted + @i64::right_shifted )) -(runtime: i64##2^16 +(runtime: i64::2^16 (_.left_shift (_.i32 +16) (_.i32 +1))) -(runtime: i64##2^32 - (_.* i64##2^16 i64##2^16)) +(runtime: i64::2^32 + (_.* i64::2^16 i64::2^16)) -(runtime: i64##2^64 - (_.* i64##2^32 i64##2^32)) +(runtime: i64::2^64 + (_.* i64::2^32 i64::2^32)) -(runtime: i64##2^63 - (|> i64##2^64 (_./ (_.i32 +2)))) +(runtime: i64::2^63 + (|> i64::2^64 (_./ (_.i32 +2)))) -(runtime: (i64##unsigned_low i64) +(runtime: (i64::unsigned_low i64) (_.return (_.? (|> i64 (_.the ..i64_low_field) (_.>= (_.i32 +0))) (|> i64 (_.the ..i64_low_field)) - (|> i64 (_.the ..i64_low_field) (_.+ i64##2^32))))) + (|> i64 (_.the ..i64_low_field) (_.+ i64::2^32))))) -(runtime: (i64##number i64) +(runtime: (i64::number i64) (_.return (|> i64 (_.the ..i64_high_field) - (_.* i64##2^32) - (_.+ (i64##unsigned_low i64))))) + (_.* i64::2^32) + (_.+ (i64::unsigned_low i64))))) -(runtime: i64##zero +(runtime: i64::zero (..i64 (_.i32 +0) (_.i32 +0))) -(runtime: i64##min +(runtime: i64::min (..i64 (_.i32 (.int (hex "80,00,00,00"))) (_.i32 +0))) -(runtime: i64##max +(runtime: i64::max (..i64 (_.i32 (.int (hex "7F,FF,FF,FF"))) (_.i32 (.int (hex "FF,FF,FF,FF"))))) -(runtime: i64##one +(runtime: i64::one (..i64 (_.i32 +0) (_.i32 +1))) -(runtime: (i64##= reference sample) +(runtime: (i64::= reference sample) (_.return (_.and (_.= (_.the ..i64_high_field reference) (_.the ..i64_high_field sample)) (_.= (_.the ..i64_low_field reference) (_.the ..i64_low_field sample))))) -(runtime: (i64##+ parameter subject) +(runtime: (i64::+ parameter subject) (let [up_16 (_.left_shift (_.i32 +16)) high_16 (_.logic_right_shift (_.i32 +16)) low_16 (_.bit_and (_.i32 (.int (hex "FFFF")))) @@ -449,30 +449,30 @@ (_.bit_or (up_16 x16) x00))) )))) -(runtime: (i64##opposite value) - (_.return (_.? (i64##= i64##min value) - i64##min - (i64##+ i64##one (i64##not value))))) +(runtime: (i64::opposite value) + (_.return (_.? (i64::= i64::min value) + i64::min + (i64::+ i64::one (i64::not value))))) -(runtime: i64##-one - (i64##opposite i64##one)) +(runtime: i64::-one + (i64::opposite i64::one)) -(runtime: (i64##of_number value) +(runtime: (i64::of_number value) (_.return (<| (_.? (_.not_a_number? value) - i64##zero) - (_.? (_.<= (_.opposite i64##2^63) value) - i64##min) - (_.? (|> value (_.+ (_.i32 +1)) (_.>= i64##2^63)) - i64##max) + i64::zero) + (_.? (_.<= (_.opposite i64::2^63) value) + i64::min) + (_.? (|> value (_.+ (_.i32 +1)) (_.>= i64::2^63)) + i64::max) (_.? (|> value (_.< (_.i32 +0))) - (|> value _.opposite i64##of_number i64##opposite)) - (..i64 (|> value (_./ i64##2^32) _.to_i32) - (|> value (_.% i64##2^32) _.to_i32))))) + (|> value _.opposite i64::of_number i64::opposite)) + (..i64 (|> value (_./ i64::2^32) _.to_i32) + (|> value (_.% i64::2^32) _.to_i32))))) -(runtime: (i64##- parameter subject) - (_.return (i64##+ (i64##opposite parameter) subject))) +(runtime: (i64::- parameter subject) + (_.return (i64::+ (i64::opposite parameter) subject))) -(runtime: (i64##* parameter subject) +(runtime: (i64::* parameter subject) (let [up_16 (_.left_shift (_.i32 +16)) high_16 (_.logic_right_shift (_.i32 +16)) low_16 (_.bit_and (_.i32 (.int (hex "FFFF")))) @@ -521,7 +521,7 @@ (_.bit_or (up_16 x16) x00))) )))) -(runtime: (i64##< parameter subject) +(runtime: (i64::< parameter subject) (let [negative? (|>> (_.the ..i64_high_field) (_.< (_.i32 +0)))] (with_vars [-subject? -parameter?] (all _.then @@ -531,65 +531,65 @@ (_.boolean true)) (_.? (_.and (_.not -subject?) -parameter?) (_.boolean false)) - (negative? (i64##- parameter subject)))) + (negative? (i64::- parameter subject)))) )))) -(def: (i64##<= param subject) +(def: (i64::<= param subject) (-> Expression Expression Expression) - (|> (i64##< param subject) - (_.or (i64##= param subject)))) + (|> (i64::< param subject) + (_.or (i64::= param subject)))) (def: negative? - (i64##< i64##zero)) + (i64::< i64::zero)) -(runtime: (i64##/ parameter subject) - (<| (_.if (i64##= i64##zero parameter) +(runtime: (i64::/ parameter subject) + (<| (_.if (i64::= i64::zero parameter) (_.throw (_.string "Cannot divide by zero!"))) - (_.if (i64##= i64##zero subject) - (_.return i64##zero)) - (_.if (i64##= i64##min subject) - (<| (_.if (_.or (i64##= i64##one parameter) - (i64##= i64##-one parameter)) - (_.return i64##min)) - (_.if (i64##= i64##min parameter) - (_.return i64##one)) + (_.if (i64::= i64::zero subject) + (_.return i64::zero)) + (_.if (i64::= i64::min subject) + (<| (_.if (_.or (i64::= i64::one parameter) + (i64::= i64::-one parameter)) + (_.return i64::min)) + (_.if (i64::= i64::min parameter) + (_.return i64::one)) (with_vars [approximation] - (let [subject/2 (..i64##arithmetic_right_shifted subject (_.i32 +1))] + (let [subject/2 (..i64::arithmetic_right_shifted subject (_.i32 +1))] (all _.then - (_.define approximation (i64##left_shifted (i64##/ parameter + (_.define approximation (i64::left_shifted (i64::/ parameter subject/2) (_.i32 +1))) - (_.if (i64##= i64##zero approximation) + (_.if (i64::= i64::zero approximation) (_.return (_.? (..negative? parameter) - i64##one - i64##-one)) - (let [remainder (i64##- (i64##* approximation + i64::one + i64::-one)) + (let [remainder (i64::- (i64::* approximation parameter) subject)] - (_.return (i64##+ (i64##/ parameter + (_.return (i64::+ (i64::/ parameter remainder) approximation))))))))) - (_.if (i64##= i64##min parameter) - (_.return i64##zero)) + (_.if (i64::= i64::min parameter) + (_.return i64::zero)) (_.if (..negative? subject) (_.return (_.? (..negative? parameter) - (i64##/ (i64##opposite parameter) - (i64##opposite subject)) - (i64##opposite (i64##/ parameter - (i64##opposite subject)))))) + (i64::/ (i64::opposite parameter) + (i64::opposite subject)) + (i64::opposite (i64::/ parameter + (i64::opposite subject)))))) (_.if (..negative? parameter) - (_.return (i64##opposite (i64##/ (i64##opposite parameter) subject)))) + (_.return (i64::opposite (i64::/ (i64::opposite parameter) subject)))) (with_vars [result remainder] (all _.then - (_.define result i64##zero) + (_.define result i64::zero) (_.define remainder subject) - (_.while (i64##<= remainder parameter) + (_.while (i64::<= remainder parameter) (with_vars [approximate approximate_result approximate_remainder log2 delta] - (let [approximate_result' (i64##of_number approximate) - approx_remainder (i64##* parameter approximate_result)] + (let [approximate_result' (i64::of_number approximate) + approx_remainder (i64::* parameter approximate_result)] (all _.then - (_.define approximate (|> (i64##number remainder) - (_./ (i64##number parameter)) + (_.define approximate (|> (i64::number remainder) + (_./ (i64::number parameter)) (_.apply_1 (_.var "Math.floor")) (_.apply_2 (_.var "Math.max") (_.i32 +1)))) (_.define log2 (|> approximate @@ -605,60 +605,60 @@ (_.define approximate_result approximate_result') (_.define approximate_remainder approx_remainder) (_.while (_.or (..negative? approximate_remainder) - (i64##< approximate_remainder + (i64::< approximate_remainder remainder)) (all _.then (_.set approximate (_.- delta approximate)) (_.set approximate_result approximate_result') (_.set approximate_remainder approx_remainder))) - (_.set result (i64##+ (_.? (i64##= i64##zero approximate_result) - i64##one + (_.set result (i64::+ (_.? (i64::= i64::zero approximate_result) + i64::one approximate_result) result)) - (_.set remainder (i64##- approximate_remainder remainder)))))) + (_.set remainder (i64::- approximate_remainder remainder)))))) (_.return result))))) -(runtime: (i64##% parameter subject) +(runtime: (i64::% parameter subject) (let [flat (|> subject - (i64##/ parameter) - (i64##* parameter))] - (_.return (i64##- flat subject)))) + (i64::/ parameter) + (i64::* parameter))] + (_.return (i64::- flat subject)))) (def: runtime//i64 Statement (all _.then ..runtime//bit - @i64##2^16 - @i64##2^32 - @i64##2^64 - @i64##2^63 - @i64##unsigned_low - @i64##new - @i64##zero - @i64##min - @i64##max - @i64##one - @i64##= - @i64##+ - @i64##opposite - @i64##-one - @i64##number - @i64##of_number - @i64##- - @i64##* - @i64##< - @i64##/ - @i64##% + @i64::2^16 + @i64::2^32 + @i64::2^64 + @i64::2^63 + @i64::unsigned_low + @i64::new + @i64::zero + @i64::min + @i64::max + @i64::one + @i64::= + @i64::+ + @i64::opposite + @i64::-one + @i64::number + @i64::of_number + @i64::- + @i64::* + @i64::< + @i64::/ + @i64::% )) (runtime: (text//index start part text) (with_vars [idx] (all _.then - (_.define idx (|> text (_.do "indexOf" (list part (i64##number start))))) + (_.define idx (|> text (_.do "indexOf" (list part (i64::number start))))) (_.return (_.? (_.= (_.i32 -1) idx) ..none - (..some (i64##of_number idx))))))) + (..some (i64::of_number idx))))))) (runtime: (text//clip offset length text) (_.return (|> text (_.do "substring" (list (_.the ..i64_low_field offset) @@ -671,7 +671,7 @@ (_.define result (|> text (_.do "charCodeAt" (list (_.the ..i64_low_field idx))))) (_.if (_.not_a_number? result) (_.throw (_.string "[Lux Error] Cannot get char from text.")) - (_.return (i64##of_number result)))))) + (_.return (i64::of_number result)))))) (def: runtime//text Statement @@ -779,4 +779,4 @@ {.#None} (|> ..runtime _.code - (# utf8.codec encoded))])]))) + (at utf8.codec encoded))])]))) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/jvm/case.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/jvm/case.lux index 8fb2dcd0c..6857dae20 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/jvm/case.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/jvm/case.lux @@ -154,7 +154,7 @@ [path|i64_fork (I64 Any) (//value.unwrap type.long) _.dup2 _.pop2 ..long _.lcmp _.ifne] [path|f64_fork Frac (//value.unwrap type.double) _.dup2 _.pop2 _.double _.dcmpl _.ifne] - [path|text_fork Text (# _.monad in []) _.dup _.pop _.string ..equals@Object _.ifeq] + [path|text_fork Text (at _.monad in []) _.dup _.pop _.string ..equals@Object _.ifeq] ) (def: (path' stack_depth @else @end phase archive) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/jvm/debug.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/jvm/debug.lux index ac744121f..020956cf5 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/jvm/debug.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/jvm/debug.lux @@ -22,7 +22,7 @@ [outcome (do (try.with @) [file (is (IO (Try (File IO))) (file.get_file io.monad file.default file_path))] - (# file over_write bytecode))] + (at file over_write bytecode))] (in (case outcome {try.#Success definition} file_path diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/jvm/host.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/jvm/host.lux index ebd1008a1..ef7876953 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/jvm/host.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/jvm/host.lux @@ -132,11 +132,11 @@ _.return)})) (sequence.sequence))] (io.run! (do [! (try.with io.monad)] - [bytecode (# ! each (format.result class.writer) - (io.io bytecode)) + [bytecode (at ! each (format.result class.writer) + (io.io bytecode)) _ (loader.store eval_class bytecode library) class (loader.load eval_class loader) - value (# io.monad in (class_value eval_class class))] + value (at io.monad in (class_value eval_class class))] (in [value [eval_class bytecode]]))))) @@ -144,8 +144,8 @@ (-> Library java/lang/ClassLoader Definition (Try Any)) (io.run! (do (try.with io.monad) [existing_class? (|> (atom.read! library) - (# io.monad each (function (_ library) - (dictionary.key? library class_name))) + (at io.monad each (function (_ library) + (dictionary.key? library class_name))) (try.lifted io.monad) (is (IO (Try Bit)))) _ (if existing_class? @@ -169,8 +169,8 @@ (is //runtime.Host (implementation (def: (evaluate context @it,valueG) - (# try.monad each product.left - (..evaluate! library loader (format "E" (//runtime.class_name context)) @it,valueG))) + (at try.monad each product.left + (..evaluate! library loader (format "E" (//runtime.class_name context)) @it,valueG))) (def: execute (..execute! library loader)) @@ -191,5 +191,5 @@ custom)] _ (loader.store class_name bytecode library) class (loader.load class_name loader)] - (# io.monad in (..class_value class_name class))))) + (at io.monad in (..class_value class_name class))))) ))]))) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/jvm/reference.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/jvm/reference.lux index 2848eab59..11db49aed 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/jvm/reference.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/jvm/reference.lux @@ -42,8 +42,8 @@ (def: (foreign archive variable) (-> Archive Register (Operation (Bytecode Any))) (do [! ////.monad] - [bytecode_name (# ! each //runtime.class_name - (generation.context archive))] + [bytecode_name (at ! each //runtime.class_name + (generation.context archive))] (in (all _.composite ..this (_.getfield (type.class bytecode_name (list)) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/jvm/runtime.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/jvm/runtime.lux index d923ea65d..4c6a232f9 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/jvm/runtime.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/jvm/runtime.lux @@ -657,4 +657,4 @@ ... This shift is done to avoid the possibility of forged labels ... to be in the range of the labels that are generated automatically ... during the evaluation of Bytecode expressions. - (# ////.monad each (|>> ++ (i64.left_shifted shift)) generation.next))) + (at ////.monad each (|>> ++ (i64.left_shifted shift)) generation.next))) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/jvm/structure.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/jvm/structure.lux index 43d48e1c3..f4b885825 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/jvm/structure.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/jvm/structure.lux @@ -32,7 +32,7 @@ (Generator (Tuple Synthesis)) (case membersS {.#End} - (# phase.monad in //runtime.unit) + (at phase.monad in //runtime.unit) {.#Item singletonS {.#End}} (phase archive singletonS) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/lua/case.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/lua/case.lux index c65093838..fd878a2b7 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/lua/case.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/lua/case.lux @@ -55,7 +55,7 @@ (do [! ///////phase.monad] [this (expression archive this) that (statement expression archive that) - $dummy (# ! each _.var (/////generation.symbol "_exec"))] + $dummy (at ! each _.var (/////generation.symbol "_exec"))] (in (all _.then (_.set (list $dummy) this) that)))) @@ -298,6 +298,6 @@ (-> Phase! (Generator [Synthesis Path])) (|> [valueS pathP] (..case! statement expression archive) - (# ///////phase.monad each - (|>> (_.closure (list)) - (_.apply (list)))))) + (at ///////phase.monad each + (|>> (_.closure (list)) + (_.apply (list)))))) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/lua/function.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/lua/function.lux index a8757090a..1c8bfca9b 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/lua/function.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/lua/function.lux @@ -73,8 +73,8 @@ [dependencies (cache.dependencies archive bodyS) [function_name body!] (/////generation.with_new_context archive dependencies (do ! - [@scope (# ! each ..@scope - (/////generation.context archive))] + [@scope (at ! each ..@scope + (/////generation.context archive))] (/////generation.with_anchor [1 @scope] (statement expression archive bodyS)))) closureO+ (monad.each ! (expression archive) environment) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/lua/loop.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/lua/loop.lux index c79123870..5e3a16128 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/lua/loop.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/lua/loop.lux @@ -59,12 +59,12 @@ {.#End} (|> bodyS (statement expression archive) - (# ///////phase.monad each (|>> [(list)]))) + (at ///////phase.monad each (|>> [(list)]))) ... true loop _ (do [! ///////phase.monad] - [@scope (# ! each ..@scope /////generation.next) + [@scope (at ! each ..@scope /////generation.next) initsO+ (monad.each ! (expression archive) initsS+) body! (/////generation.with_anchor [start @scope] (statement expression archive bodyS))] diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/lua/runtime.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/lua/runtime.lux index 9b72bdf74..a286396f4 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/lua/runtime.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/lua/runtime.lux @@ -199,31 +199,31 @@ (_.var "table.move")))) ))))) -(runtime: (sum//get sum expected##right? expected##lefts) +(runtime: (sum//get sum expected::right? expected::lefts) (let [mismatch! (_.return _.nil) - actual##lefts (_.the ..variant_tag_field sum) - actual##right? (_.the ..variant_flag_field sum) - actual##value (_.the ..variant_value_field sum) + actual::lefts (_.the ..variant_tag_field sum) + actual::right? (_.the ..variant_flag_field sum) + actual::value (_.the ..variant_value_field sum) recur! (all _.then - (_.set (list expected##lefts) (|> expected##lefts - (_.- actual##lefts) + (_.set (list expected::lefts) (|> expected::lefts + (_.- actual::lefts) (_.- (_.int +1)))) - (_.set (list sum) actual##value))] + (_.set (list sum) actual::value))] (<| (_.while (_.boolean true)) - (_.if (_.= expected##lefts actual##lefts) - (_.if (_.= expected##right? actual##right?) - (_.return actual##value) + (_.if (_.= expected::lefts actual::lefts) + (_.if (_.= expected::right? actual::right?) + (_.return actual::value) mismatch!)) - (_.if (_.< expected##lefts actual##lefts) - (_.if (_.= ..unit actual##right?) + (_.if (_.< expected::lefts actual::lefts) + (_.if (_.= ..unit actual::right?) recur! mismatch!)) - (_.if (_.= ..unit expected##right?) - (_.return (variant' (|> actual##lefts - (_.- expected##lefts) + (_.if (_.= ..unit expected::right?) + (_.return (variant' (|> actual::lefts + (_.- expected::lefts) (_.- (_.int +1))) - actual##right? - actual##value))) + actual::right? + actual::value))) mismatch!))) (def: runtime//adt @@ -433,4 +433,4 @@ {.#None} (|> ..runtime _.code - (# utf8.codec encoded))])]))) + (at utf8.codec encoded))])]))) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/php/case.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/php/case.lux index 9815d9e3e..c05a3813d 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/php/case.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/php/case.lux @@ -213,7 +213,7 @@ (pattern (<simple> idx nextP)) (|> nextP again - (# ///////phase.monad each (_.then (<choice> true idx))))]) + (at ///////phase.monad each (_.then (<choice> true idx))))]) ([/////synthesis.side/left /////synthesis.simple_left_side ..left_choice] [/////synthesis.side/right /////synthesis.simple_right_side ..right_choice]) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/php/function.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/php/function.lux index b6c9d1ab2..ff3335b50 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/php/function.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/php/function.lux @@ -72,8 +72,8 @@ (do [! ///////phase.monad] [[function_name body!] (/////generation.with_new_context archive (do ! - [@scope (# ! each ..@scope - (/////generation.context archive))] + [@scope (at ! each ..@scope + (/////generation.context archive))] (/////generation.with_anchor [1 @scope] (statement expression archive bodyS)))) closureG+ (monad.each ! (expression archive) environment) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/php/loop.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/php/loop.lux index 633b2c724..c275144ac 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/php/loop.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/php/loop.lux @@ -58,7 +58,7 @@ ... true loop _ (do [! ///////phase.monad] - [@scope (# ! each ..@scope /////generation.next) + [@scope (at ! each ..@scope /////generation.next) initsO+ (monad.each ! (expression archive) initsS+) body! (/////generation.with_anchor [start @scope] (statement expression archive bodyS))] diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/php/runtime.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/php/runtime.lux index 649463554..cb5b3c882 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/php/runtime.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/php/runtime.lux @@ -607,4 +607,4 @@ (sequence.sequence [..module_id (|> ..runtime _.code - (# utf8.codec encoded))])]))) + (at utf8.codec encoded))])]))) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/python/case.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/python/case.lux index dbb669dd8..d05828a5f 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/python/case.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/python/case.lux @@ -222,10 +222,10 @@ [{<tag> item} (do [! ///////phase.monad] [clauses (monad.each ! (function (_ [match then]) - (# ! each - (|>> [(_.= (|> match <format>) - ..peek)]) - (again then))) + (at ! each + (|>> [(_.= (|> match <format>) + ..peek)]) + (again then))) {.#Item item})] (in {.#Some (list#mix (function (_ [when then] else) (_.if when then else)) @@ -236,7 +236,7 @@ [/////synthesis.#Text_Fork (<| //primitive.text)]) _ - (# ///////phase.monad in {.#None}))) + (at ///////phase.monad in {.#None}))) (def: (pattern_matching' in_closure? statement expression archive) (-> Bit Phase! Phase Archive Path (Operation (Statement Any))) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/python/runtime.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/python/runtime.lux index bc10a524b..1530c23eb 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/python/runtime.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/python/runtime.lux @@ -236,31 +236,31 @@ (_.return (_.slice_from right_index tuple)))) {.#None})))) -(runtime: (sum::get sum expected##right? expected##lefts) +(runtime: (sum::get sum expected::right? expected::lefts) (let [mismatch! (_.return _.none) - actual##lefts (_.item (_.int +0) sum) - actual##right? (_.item (_.int +1) sum) - actual##value (_.item (_.int +2) sum) + actual::lefts (_.item (_.int +0) sum) + actual::right? (_.item (_.int +1) sum) + actual::value (_.item (_.int +2) sum) recur! (all _.then - (_.set (list expected##lefts) (|> expected##lefts - (_.- actual##lefts) + (_.set (list expected::lefts) (|> expected::lefts + (_.- actual::lefts) (_.- (_.int +1)))) - (_.set (list sum) actual##value))] + (_.set (list sum) actual::value))] (_.while (_.bool true) - (<| (_.if (_.= expected##lefts actual##lefts) - (_.if (_.= expected##right? actual##right?) - (_.return actual##value) + (<| (_.if (_.= expected::lefts actual::lefts) + (_.if (_.= expected::right? actual::right?) + (_.return actual::value) mismatch!)) - (_.if (_.< expected##lefts actual##lefts) - (_.if (_.= ..unit actual##right?) + (_.if (_.< expected::lefts actual::lefts) + (_.if (_.= ..unit actual::right?) recur! mismatch!)) - (_.if (_.= ..unit expected##right?) - (_.return (variant' (|> actual##lefts - (_.- expected##lefts) + (_.if (_.= ..unit expected::right?) + (_.return (variant' (|> actual::lefts + (_.- expected::lefts) (_.- (_.int +1))) - actual##right? - actual##value))) + actual::right? + actual::value))) mismatch!) {.#None}))) @@ -460,4 +460,4 @@ {.#None} (|> ..runtime _.code - (# utf8.codec encoded))])]))) + (at utf8.codec encoded))])]))) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/r/case.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/r/case.lux index 1ad75fe08..52626fefb 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/r/case.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/r/case.lux @@ -234,8 +234,8 @@ (Generator [Synthesis Path]) (do [! ///////phase.monad] [valueO (expression archive valueS)] - (<| (# ! each (|>> (all _.then - (_.set! $cursor (_.list (list valueO))) - (_.set! $savepoint (_.list (list)))) - _.block)) + (<| (at ! each (|>> (all _.then + (_.set! $cursor (_.list (list valueO))) + (_.set! $savepoint (_.list (list)))) + _.block)) (pattern_matching expression archive pathP)))) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/r/function.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/r/function.lux index 59b92e776..2e9a49cef 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/r/function.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/r/function.lux @@ -76,8 +76,8 @@ (do [! ///////phase.monad] [[[function_module function_artifact] bodyO] (/////generation.with_new_context archive (do ! - [$self (# ! each (|>> ///reference.artifact _.var) - (/////generation.context archive))] + [$self (at ! each (|>> ///reference.artifact _.var) + (/////generation.context archive))] (/////generation.with_anchor $self (expression archive bodyS)))) closureO+ (monad.each ! (expression archive) environment) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/r/loop.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/r/loop.lux index f3756aad8..3b154ef14 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/r/loop.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/r/loop.lux @@ -43,7 +43,7 @@ ... true loop _ (do [! ///////phase.monad] - [$scope (# ! each _.var (/////generation.symbol "loop_scope")) + [$scope (at ! each _.var (/////generation.symbol "loop_scope")) initsO+ (monad.each ! (expression archive) initsS+) bodyO (/////generation.with_anchor $scope (expression archive bodyS))] diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/r/runtime.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/r/runtime.lux index e430bfaff..8e4686a3d 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/r/runtime.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/r/runtime.lux @@ -842,4 +842,4 @@ (sequence.sequence [(%.nat ..module_id) (|> ..runtime _.code - (# utf8.codec encoded))])]))) + (at utf8.codec encoded))])]))) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/reference.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/reference.lux index f93648d04..94f243273 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/reference.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/reference.lux @@ -64,7 +64,7 @@ (All (_ anchor expression directive) (-> (System expression) Archive Symbol (////generation.Operation anchor expression directive expression))) - (phase#each (|>> ..artifact (# system constant')) + (phase#each (|>> ..artifact (at system constant')) (////generation.remember archive name))) (template [<sigil> <name>] @@ -72,7 +72,7 @@ (All (_ expression) (-> (System expression) (-> Register expression))) - (|>> %.nat (format <sigil>) (# system variable')))] + (|>> %.nat (format <sigil>) (at system variable')))] ["f" foreign] ["l" local] diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/ruby/case.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/ruby/case.lux index 0f805e277..56b9b11f6 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/ruby/case.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/ruby/case.lux @@ -231,10 +231,10 @@ [{<tag> item} (do [! ///////phase.monad] [clauses (monad.each ! (function (_ [match then]) - (# ! each - (|>> [(_.= (|> match <format>) - ..peek)]) - (again then))) + (at ! each + (|>> [(_.= (|> match <format>) + ..peek)]) + (again then))) {.#Item item})] (in {.#Some (list#mix (function (_ [when then] else) (_.if when then else)) @@ -245,7 +245,7 @@ [/////synthesis.#Text_Fork (<| //primitive.text)]) _ - (# ///////phase.monad in {.#None}))) + (at ///////phase.monad in {.#None}))) (def: (pattern_matching' in_closure? statement expression archive) (-> Bit (Generator! Path)) @@ -288,10 +288,10 @@ [{<tag> item} (do [! ///////phase.monad] [clauses (monad.each ! (function (_ [match then]) - (# ! each - (|>> [(_.= (|> match <format>) - ..peek)]) - (again then))) + (at ! each + (|>> [(_.= (|> match <format>) + ..peek)]) + (again then))) {.#Item item})] (in (list#mix (function (_ [when then] else) (_.if when then else)) @@ -378,6 +378,6 @@ (-> Phase! (Generator [Synthesis Path])) (|> case (case! true statement expression archive) - (# ///////phase.monad each - (|>> [(list)] (_.lambda {.#None}) - (_.apply_lambda (list)))))) + (at ///////phase.monad each + (|>> [(list)] (_.lambda {.#None}) + (_.apply_lambda (list)))))) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/ruby/runtime.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/ruby/runtime.lux index e309396f2..f21273b23 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/ruby/runtime.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/ruby/runtime.lux @@ -214,31 +214,31 @@ (-> Expression Computation) ..right) -(runtime: (sum//get sum expected##right? expected##lefts) +(runtime: (sum//get sum expected::right? expected::lefts) (let [mismatch! (_.return _.nil) - actual##lefts (_.item (_.string ..variant_tag_field) sum) - actual##right? (_.item (_.string ..variant_flag_field) sum) - actual##value (_.item (_.string ..variant_value_field) sum) + actual::lefts (_.item (_.string ..variant_tag_field) sum) + actual::right? (_.item (_.string ..variant_flag_field) sum) + actual::value (_.item (_.string ..variant_value_field) sum) recur! (all _.then - (_.set (list expected##lefts) (|> expected##lefts - (_.- actual##lefts) + (_.set (list expected::lefts) (|> expected::lefts + (_.- actual::lefts) (_.- (_.int +1)))) - (_.set (list sum) actual##value))] + (_.set (list sum) actual::value))] (<| (_.while (_.bool true)) - (_.if (_.= expected##lefts actual##lefts) - (_.if (_.= expected##right? actual##right?) - (_.return actual##value) + (_.if (_.= expected::lefts actual::lefts) + (_.if (_.= expected::right? actual::right?) + (_.return actual::value) mismatch!)) - (_.if (_.< expected##lefts actual##lefts) - (_.if (_.= ..unit actual##right?) + (_.if (_.< expected::lefts actual::lefts) + (_.if (_.= ..unit actual::right?) recur! mismatch!)) - (_.if (_.= ..unit expected##right?) - (_.return (sum//make (|> actual##lefts - (_.- expected##lefts) + (_.if (_.= ..unit expected::right?) + (_.return (sum//make (|> actual::lefts + (_.- expected::lefts) (_.- (_.int +1))) - actual##right? - actual##value))) + actual::right? + actual::value))) mismatch!))) (def: runtime//adt @@ -273,15 +273,15 @@ @lux//program_args )) -(def: i64##+limit (_.manual "+0x7FFFFFFFFFFFFFFF")) -(def: i64##-limit (_.manual "-0x8000000000000000")) -(def: i64##+cap (_.manual "+0x8000000000000000")) -(def: i64##-cap (_.manual "-0x8000000000000001")) +(def: i64::+limit (_.manual "+0x7FFFFFFFFFFFFFFF")) +(def: i64::-limit (_.manual "-0x8000000000000000")) +(def: i64::+cap (_.manual "+0x8000000000000000")) +(def: i64::-cap (_.manual "-0x8000000000000001")) -(runtime: i64##+iteration (_.manual "(+1<<64)")) -(runtime: i64##-iteration (_.manual "(-1<<64)")) +(runtime: i64::+iteration (_.manual "(+1<<64)")) +(runtime: i64::-iteration (_.manual "(-1<<64)")) -(runtime: (i64##i64 input) +(runtime: (i64::i64 input) [..mruby? (_.return input)] (with_vars [temp] (`` (<| (~~ (template [<scenario> <iteration> <cap> <entrance>] @@ -292,49 +292,49 @@ (|> temp (_.- <cap>) (_.+ <entrance>)) temp))))] - [(_.> ..i64##+limit) ..i64##+iteration ..i64##+cap ..i64##-limit] - [(_.< ..i64##-limit) ..i64##-iteration ..i64##-cap ..i64##+limit] + [(_.> ..i64::+limit) ..i64::+iteration ..i64::+cap ..i64::-limit] + [(_.< ..i64::-limit) ..i64::-iteration ..i64::-cap ..i64::+limit] )) (_.return input))))) -(def: i32##low +(def: i32::low (|>> (_.bit_and (_.manual "+0xFFFFFFFF")))) -(def: i32##high +(def: i32::high (|>> (_.bit_shr (_.int +32)) - ..i32##low)) + ..i32::low)) -(def: i32##positive? +(def: i32::positive? (|>> (_.bit_and (_.manual "+0x80000000")) (_.= (_.int +0)))) -(def: i32##up +(def: i32::up (_.bit_shl (_.int +32))) (template: (i64 @high @low) - [(|> (_.? (i32##positive? @high) + [(|> (_.? (i32::positive? @high) @high (|> (_.manual "+0xFFFFFFFF") (_.- @high) _.bit_not)) - i32##up + i32::up (_.bit_or @low))]) (def: as_nat - (_.% ..i64##+iteration)) + (_.% ..i64::+iteration)) (template [<runtime> <host>] [(runtime: (<runtime> left right) - [..normal_ruby? (_.return (..i64##i64 (<host> (..as_nat left) (..as_nat right))))] + [..normal_ruby? (_.return (..i64::i64 (<host> (..as_nat left) (..as_nat right))))] (with_vars [high low] (all _.then - (_.set (list high) (<host> (i32##high left) (..i32##high right))) - (_.set (list low) (<host> (i32##low left) (..i32##low right))) + (_.set (list high) (<host> (i32::high left) (..i32::high right))) + (_.set (list low) (<host> (i32::low left) (..i32::low right))) (_.return (..i64 high low)))))] - [i64##and _.bit_and] - [i64##or _.bit_or] - [i64##xor _.bit_xor] + [i64::and _.bit_and] + [i64::or _.bit_or] + [i64::xor _.bit_xor] ) (def: (cap_shift! shift) @@ -350,28 +350,28 @@ (-> LVar Expression) (|>> (_.< (_.int +32)))) -(runtime: (i64##left_shifted shift input) +(runtime: (i64::left_shifted shift input) [..normal_ruby? (_.return (|> input (_.bit_shl (_.% (_.int +64) shift)) - ..i64##i64))] + ..i64::i64))] (with_vars [high low] (all _.then (..cap_shift! shift) (<| (..handle_no_shift! shift input) (_.if (..small_shift? shift) (all _.then - (_.set (list high) (_.bit_or (|> input i32##high (_.bit_shl shift)) - (|> input i32##low (_.bit_shr (_.- shift (_.int +32)))))) - (_.set (list low) (|> input i32##low (_.bit_shl shift))) - (_.return (..i64 (i32##low high) - (i32##low low))))) + (_.set (list high) (_.bit_or (|> input i32::high (_.bit_shl shift)) + (|> input i32::low (_.bit_shr (_.- shift (_.int +32)))))) + (_.set (list low) (|> input i32::low (_.bit_shl shift))) + (_.return (..i64 (i32::low high) + (i32::low low))))) (all _.then - (_.set (list high) (|> input i32##low (_.bit_shl (_.- (_.int +32) shift)))) - (_.return (..i64 (i32##low high) + (_.set (list high) (|> input i32::low (_.bit_shl (_.- (_.int +32) shift)))) + (_.return (..i64 (i32::low high) (_.int +0))))) ))) -(runtime: (i64##right_shifted shift input) +(runtime: (i64::right_shifted shift input) [..normal_ruby? (all _.then (_.set (list shift) (_.% (_.int +64) shift)) (_.return (_.? (_.= (_.int +0) shift) @@ -385,15 +385,15 @@ (<| (..handle_no_shift! shift input) (_.if (..small_shift? shift) (all _.then - (_.set (list high) (|> input i32##high (_.bit_shr shift))) - (_.set (list low) (|> input i32##low (_.bit_shr shift) - (_.bit_or (|> input i32##high (_.bit_shl (_.- shift (_.int +32))))))) + (_.set (list high) (|> input i32::high (_.bit_shr shift))) + (_.set (list low) (|> input i32::low (_.bit_shr shift) + (_.bit_or (|> input i32::high (_.bit_shl (_.- shift (_.int +32))))))) (_.return (..i64 high low)))) (_.return (_.? (|> shift (_.= (_.int +32))) - (i32##high input) - (|> input i32##high (_.bit_shr (_.- (_.int +32) shift))))))))) + (i32::high input) + (|> input i32::high (_.bit_shr (_.- (_.int +32) shift))))))))) -(runtime: (i64##/ parameter subject) +(runtime: (i64::/ parameter subject) (_.return (_.? (_.and (_.= (_.int -1) parameter) (_.= (_.int int#bottom) subject)) subject @@ -402,47 +402,47 @@ (_.- extra) (_./ parameter)))))) -(runtime: (i64##+ parameter subject) - [..normal_ruby? (_.return (i64##i64 (_.+ parameter subject)))] +(runtime: (i64::+ parameter subject) + [..normal_ruby? (_.return (i64::i64 (_.+ parameter subject)))] (with_vars [high low] (all _.then - (_.set (list low) (_.+ (i32##low subject) - (i32##low parameter))) - (_.set (list high) (|> (i32##high low) - (_.+ (i32##high subject)) - (_.+ (i32##high parameter)) - i32##low)) - - (_.return (..i64 high (i32##low low))) + (_.set (list low) (_.+ (i32::low subject) + (i32::low parameter))) + (_.set (list high) (|> (i32::high low) + (_.+ (i32::high subject)) + (_.+ (i32::high parameter)) + i32::low)) + + (_.return (..i64 high (i32::low low))) ))) -(def: i64##min +(def: i64::min (_.manual "-0x8000000000000000")) -(def: (i64##opposite value) - (_.? (_.= i64##min value) - i64##min - (i64##+ (_.int +1) (_.bit_not value)))) +(def: (i64::opposite value) + (_.? (_.= i64::min value) + i64::min + (i64::+ (_.int +1) (_.bit_not value)))) -(runtime: (i64##- parameter subject) - [..normal_ruby? (_.return (i64##i64 (_.- parameter subject)))] - (_.return (i64##+ (i64##opposite parameter) subject))) +(runtime: (i64::- parameter subject) + [..normal_ruby? (_.return (i64::i64 (_.- parameter subject)))] + (_.return (i64::+ (i64::opposite parameter) subject))) -(def: i16##high +(def: i16::high (_.bit_shr (_.int +16))) -(def: i16##low +(def: i16::low (_.bit_and (_.manual "+0xFFFF"))) -(def: i16##up +(def: i16::up (_.bit_shl (_.int +16))) -(runtime: (i64##* parameter subject) - [..normal_ruby? (_.return (i64##i64 (_.* parameter subject)))] - (let [hh (|>> i32##high i16##high) - hl (|>> i32##high i16##low) - lh (|>> i32##low i16##high) - ll (|>> i32##low i16##low)] +(runtime: (i64::* parameter subject) + [..normal_ruby? (_.return (i64::i64 (_.* parameter subject)))] + (let [hh (|>> i32::high i16::high) + hl (|>> i32::high i16::low) + lh (|>> i32::low i16::high) + ll (|>> i32::low i16::low)] (with_vars [l48 l32 l16 l00 r48 r32 r16 r00 x48 x32 x16 x00 @@ -459,54 +459,54 @@ (_.set (list r00) (ll parameter)) (_.set (list x00) (_.* l00 r00)) - (_.set (list x16) (i16##high x00)) - (_.set (list x00) (i16##low x00)) + (_.set (list x16) (i16::high x00)) + (_.set (list x00) (i16::low x00)) (_.set (list x16) (|> x16 (_.+ (_.* l16 r00)))) - (_.set (list x32) (i16##high x16)) (_.set (list x16) (i16##low x16)) + (_.set (list x32) (i16::high x16)) (_.set (list x16) (i16::low x16)) (_.set (list x16) (|> x16 (_.+ (_.* l00 r16)))) - (_.set (list x32) (|> x32 (_.+ (i16##high x16)))) (_.set (list x16) (i16##low x16)) + (_.set (list x32) (|> x32 (_.+ (i16::high x16)))) (_.set (list x16) (i16::low x16)) (_.set (list x32) (|> x32 (_.+ (_.* l32 r00)))) - (_.set (list x48) (i16##high x32)) (_.set (list x32) (i16##low x32)) + (_.set (list x48) (i16::high x32)) (_.set (list x32) (i16::low x32)) (_.set (list x32) (|> x32 (_.+ (_.* l16 r16)))) - (_.set (list x48) (|> x48 (_.+ (i16##high x32)))) (_.set (list x32) (i16##low x32)) + (_.set (list x48) (|> x48 (_.+ (i16::high x32)))) (_.set (list x32) (i16::low x32)) (_.set (list x32) (|> x32 (_.+ (_.* l00 r32)))) - (_.set (list x48) (|> x48 (_.+ (i16##high x32)))) (_.set (list x32) (i16##low x32)) + (_.set (list x48) (|> x48 (_.+ (i16::high x32)))) (_.set (list x32) (i16::low x32)) (_.set (list x48) (|> x48 (_.+ (_.* l48 r00)) (_.+ (_.* l32 r16)) (_.+ (_.* l16 r32)) (_.+ (_.* l00 r48)) - i16##low)) + i16::low)) - (_.set (list high) (_.bit_or (i16##up x48) x32)) - (_.set (list low) (_.bit_or (i16##up x16) x00)) + (_.set (list high) (_.bit_or (i16::up x48) x32)) + (_.set (list low) (_.bit_or (i16::up x16) x00)) (_.return (..i64 high low)) ))) ) -(runtime: (i64##char subject) +(runtime: (i64::char subject) [..mruby? (_.return (_.do "chr" (list) {.#None} subject))] (_.return (_.do "chr" (list (_.string "UTF-8")) {.#None} subject))) (def: runtime//i64 Statement (all _.then - @i64##+iteration - @i64##-iteration - @i64##i64 - @i64##left_shifted - @i64##right_shifted - @i64##and - @i64##or - @i64##xor - @i64##+ - @i64##- - @i64##* - @i64##/ - @i64##char + @i64::+iteration + @i64::-iteration + @i64::i64 + @i64::left_shifted + @i64::right_shifted + @i64::and + @i64::or + @i64::xor + @i64::+ + @i64::- + @i64::* + @i64::/ + @i64::char )) (runtime: (f64//decode inputG) @@ -601,4 +601,4 @@ {.#None} (|> ..runtime _.code - (# utf8.codec encoded))])]))) + (at utf8.codec encoded))])]))) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/scheme/case.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/scheme/case.lux index 0c5465e96..9a7db7f48 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/scheme/case.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/scheme/case.lux @@ -211,14 +211,14 @@ (def: (pattern_matching expression archive pathP) (Generator Path) - (# ///////phase.monad each - (try_pm (_.raise/1 (_.string "Invalid expression for pattern-matching."))) - (pattern_matching' expression archive pathP))) + (at ///////phase.monad each + (try_pm (_.raise/1 (_.string "Invalid expression for pattern-matching."))) + (pattern_matching' expression archive pathP))) (def: .public (case expression archive [valueS pathP]) (Generator [Synthesis Path]) (do [! ///////phase.monad] [valueO (expression archive valueS)] - (<| (# ! each (_.let (list [@cursor (_.list/* (list valueO))] - [@savepoint (_.list/* (list))]))) + (<| (at ! each (_.let (list [@cursor (_.list/* (list valueO))] + [@savepoint (_.list/* (list))]))) (pattern_matching expression archive pathP)))) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/scheme/function.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/scheme/function.lux index c937c11e7..6f5654056 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/scheme/function.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/scheme/function.lux @@ -65,8 +65,8 @@ (do [! ///////phase.monad] [[function_name bodyO] (/////generation.with_new_context archive (do ! - [@self (# ! each (|>> ///reference.artifact _.var) - (/////generation.context archive))] + [@self (at ! each (|>> ///reference.artifact _.var) + (/////generation.context archive))] (/////generation.with_anchor @self (expression archive bodyS)))) closureO+ (monad.each ! (expression archive) environment) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/scheme/runtime.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/scheme/runtime.lux index 94b77f919..c147bf10a 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/scheme/runtime.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/generation/scheme/runtime.lux @@ -367,4 +367,4 @@ (sequence.sequence [(%.nat ..module_id) (|> ..runtime _.code - (# utf8.codec encoded))])]))) + (at utf8.codec encoded))])]))) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/synthesis/case.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/synthesis/case.lux index bdbcdeb02..a24d6f7d4 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/synthesis/case.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/synthesis/case.lux @@ -66,7 +66,7 @@ [///simple.#Text /.#Text_Fork |>])) {///pattern.#Bind register} - (<| (# ///.monad each (|>> {/.#Seq {/.#Bind register}})) + (<| (at ///.monad each (|>> {/.#Seq {/.#Bind register}})) /.with_new_local thenC) @@ -106,7 +106,7 @@ (All (_ a) (-> (-> Path Path Path) (Equivalence a) [a Path] (/.Fork a Path) (/.Fork a Path))) - (if (# equivalence = new_test old_test) + (if (at equivalence = new_test old_test) [[old_test (weave new_then old_then)] old_tail] [[old_test old_then] (case old_tail diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/synthesis/function.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/synthesis/function.lux index dec9a0177..ac7a81a73 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/synthesis/function.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/synthesis/function.lux @@ -113,7 +113,7 @@ [then (grow_path grow then) else (case else {.#Some else} - (# ! each (|>> {.#Some}) (grow_path grow else)) + (at ! each (|>> {.#Some}) (grow_path grow else)) {.#None} (in {.#None}))] @@ -266,10 +266,10 @@ (pattern (/.function/abstraction [env' down_arity' bodyS'])) (|> bodyS' (grow env') - (# ! each (function (_ body) - [/.#environment environment - /.#arity (++ down_arity') - /.#body body]))) + (at ! each (function (_ body) + [/.#environment environment + /.#arity (++ down_arity') + /.#body body]))) _ (in [/.#environment environment diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/synthesis/loop.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/synthesis/loop.lux index b3cb4d704..d57b85be1 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/synthesis/loop.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/synthesis/loop.lux @@ -49,7 +49,7 @@ [then (again then) else (case else {.#Some else} - (# ! each (|>> {.#Some}) (again else)) + (at ! each (|>> {.#Some}) (again else)) {.#None} (in {.#None}))] diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/phase/synthesis/variable.lux b/stdlib/source/library/lux/tool/compiler/language/lux/phase/synthesis/variable.lux index 584612bbb..1ea006203 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/phase/synthesis/variable.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/phase/synthesis/variable.lux @@ -265,10 +265,10 @@ [[redundancy then] (again [redundancy then]) [redundancy else] (case else {.#Some else} - (# ! each - (function (_ [redundancy else]) - [redundancy {.#Some else}]) - (again [redundancy else])) + (at ! each + (function (_ [redundancy else]) + [redundancy {.#Some else}]) + (again [redundancy else])) {.#None} (in [redundancy {.#None}]))] @@ -453,4 +453,4 @@ (-> Synthesis (Try Synthesis)) (|>> [..initial] optimization' - (# try.monad each product.right))) + (at try.monad each product.right))) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/syntax.lux b/stdlib/source/library/lux/tool/compiler/language/lux/syntax.lux index cd3910d49..3b7d560b4 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/syntax.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/syntax.lux @@ -324,7 +324,7 @@ [(case (|> <source_code> (!clip <start> <end>) (text.replaced ..digit_separator "") - (# <codec> decoded)) + (at <codec> decoded)) {.#Right output} {.#Right [[(let [[where::file where::line where::column] where] [where::file where::line (!n/+ (!n/- <start> <end>) where::column)]) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/synthesis.lux b/stdlib/source/library/lux/tool/compiler/language/lux/synthesis.lux index d1cad0503..2f9b007dd 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/synthesis.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/synthesis.lux @@ -420,21 +420,21 @@ {#Bit_Fork sample_when sample_then sample_else}] (and (bit#= reference_when sample_when) (= reference_then sample_then) - (# (maybe.equivalence =) = reference_else sample_else)) + (at (maybe.equivalence =) = reference_else sample_else)) (^.template [<tag> <equivalence>] [[{<tag> reference_item} {<tag> sample_item}] - (# (list.equivalence (product.equivalence <equivalence> =)) = - {.#Item reference_item} - {.#Item sample_item})]) + (at (list.equivalence (product.equivalence <equivalence> =)) = + {.#Item reference_item} + {.#Item sample_item})]) ([#I64_Fork (is (Equivalence I64) i64.equivalence)] [#F64_Fork f.equivalence] [#Text_Fork text.equivalence]) (^.template [<tag> <equivalence>] [[{<tag> reference'} {<tag> sample'}] - (# <equivalence> = reference' sample')]) + (at <equivalence> = reference' sample')]) ([#Access /access.equivalence] [#Then equivalence]) @@ -455,7 +455,7 @@ (All (_ a) (-> (Hash a) (Hash (Path' a)))) (def: equivalence - (..path'_equivalence (# super equivalence))) + (..path'_equivalence (at super equivalence))) (def: (hash value) (case value @@ -463,23 +463,23 @@ 2 {#Access access} - (n.* 3 (# /access.hash hash access)) + (n.* 3 (at /access.hash hash access)) {#Bind register} - (n.* 5 (# n.hash hash register)) + (n.* 5 (at n.hash hash register)) {#Bit_Fork when then else} (all n.* 7 - (# bit.hash hash when) + (at bit.hash hash when) (hash then) - (# (maybe.hash (path'_hash super)) hash else)) + (at (maybe.hash (path'_hash super)) hash else)) (^.template [<factor> <tag> <hash>] [{<tag> item} (let [case_hash (product.hash <hash> (path'_hash super)) item_hash (product.hash case_hash (list.hash case_hash))] - (n.* <factor> (# item_hash hash item)))]) + (n.* <factor> (at item_hash hash item)))]) ([11 #I64_Fork i64.hash] [13 #F64_Fork f.hash] [17 #Text_Fork text.hash]) @@ -488,12 +488,12 @@ [{<tag> fork} (let [again_hash (path'_hash super) fork_hash (product.hash again_hash again_hash)] - (n.* <factor> (# fork_hash hash fork)))]) + (n.* <factor> (at fork_hash hash fork)))]) ([19 #Alt] [23 #Seq]) {#Then body} - (n.* 29 (# super hash body)) + (n.* 29 (at super hash body)) ))) (implementation: (branch_equivalence (open "#[0]")) @@ -515,13 +515,13 @@ [{#Get [reference_path reference_record]} {#Get [sample_path sample_record]}] - (and (# (list.equivalence /member.equivalence) = reference_path sample_path) + (and (at (list.equivalence /member.equivalence) = reference_path sample_path) (#= reference_record sample_record)) [{#Case [reference_input reference_path]} {#Case [sample_input sample_path]}] (and (#= reference_input sample_input) - (# (path'_equivalence #=) = reference_path sample_path)) + (at (path'_equivalence #=) = reference_path sample_path)) _ false))) @@ -530,36 +530,36 @@ (All (_ a) (-> (Hash a) (Hash (Branch a)))) (def: equivalence - (..branch_equivalence (# super equivalence))) + (..branch_equivalence (at super equivalence))) (def: (hash value) (case value {#Exec this that} (all n.* 2 - (# super hash this) - (# super hash that)) + (at super hash this) + (at super hash that)) {#Let [input register body]} (all n.* 3 - (# super hash input) - (# n.hash hash register) - (# super hash body)) + (at super hash input) + (at n.hash hash register) + (at super hash body)) {#If [test then else]} (all n.* 5 - (# super hash test) - (# super hash then) - (# super hash else)) + (at super hash test) + (at super hash then) + (at super hash else)) {#Get [path record]} (all n.* 7 - (# (list.hash /member.hash) hash path) - (# super hash record)) + (at (list.hash /member.hash) hash path) + (at super hash record)) {#Case [input path]} (all n.* 11 - (# super hash input) - (# (..path'_hash super) hash path)) + (at super hash input) + (at (..path'_hash super) hash path)) ))) (implementation: (loop_equivalence (open "/#[0]")) @@ -570,11 +570,11 @@ [{#Scope [reference_start reference_inits reference_iteration]} {#Scope [sample_start sample_inits sample_iteration]}] (and (n.= reference_start sample_start) - (# (list.equivalence /#=) = reference_inits sample_inits) + (at (list.equivalence /#=) = reference_inits sample_inits) (/#= reference_iteration sample_iteration)) [{#Again reference} {#Again sample}] - (# (list.equivalence /#=) = reference sample) + (at (list.equivalence /#=) = reference sample) _ false))) @@ -583,19 +583,19 @@ (All (_ a) (-> (Hash a) (Hash (Loop a)))) (def: equivalence - (..loop_equivalence (# super equivalence))) + (..loop_equivalence (at super equivalence))) (def: (hash value) (case value {#Scope [start inits iteration]} (all n.* 2 - (# n.hash hash start) - (# (list.hash super) hash inits) - (# super hash iteration)) + (at n.hash hash start) + (at (list.hash super) hash inits) + (at super hash iteration)) {#Again resets} (all n.* 3 - (# (list.hash super) hash resets)) + (at (list.hash super) hash resets)) ))) (implementation: (function_equivalence (open "#[0]")) @@ -605,14 +605,14 @@ (case [reference sample] [{#Abstraction [reference_environment reference_arity reference_body]} {#Abstraction [sample_environment sample_arity sample_body]}] - (and (# (list.equivalence #=) = reference_environment sample_environment) + (and (at (list.equivalence #=) = reference_environment sample_environment) (n.= reference_arity sample_arity) (#= reference_body sample_body)) [{#Apply [reference_abstraction reference_arguments]} {#Apply [sample_abstraction sample_arguments]}] (and (#= reference_abstraction sample_abstraction) - (# (list.equivalence #=) = reference_arguments sample_arguments)) + (at (list.equivalence #=) = reference_arguments sample_arguments)) _ false))) @@ -621,20 +621,20 @@ (All (_ a) (-> (Hash a) (Hash (Function a)))) (def: equivalence - (..function_equivalence (# super equivalence))) + (..function_equivalence (at super equivalence))) (def: (hash value) (case value {#Abstraction [environment arity body]} (all n.* 2 - (# (list.hash super) hash environment) - (# n.hash hash arity) - (# super hash body)) + (at (list.hash super) hash environment) + (at n.hash hash arity) + (at super hash body)) {#Apply [abstraction arguments]} (all n.* 3 - (# super hash abstraction) - (# (list.hash super) hash arguments)) + (at super hash abstraction) + (at (list.hash super) hash arguments)) ))) (implementation: (control_equivalence (open "#[0]")) @@ -644,7 +644,7 @@ (case [reference sample] (^.template [<tag> <equivalence>] [[{<tag> reference} {<tag> sample}] - (# (<equivalence> #=) = reference sample)]) + (at (<equivalence> #=) = reference sample)]) ([#Branch ..branch_equivalence] [#Loop ..loop_equivalence] [#Function ..function_equivalence]) @@ -656,13 +656,13 @@ (All (_ a) (-> (Hash a) (Hash (Control a)))) (def: equivalence - (..control_equivalence (# super equivalence))) + (..control_equivalence (at super equivalence))) (def: (hash value) (case value (^.template [<factor> <tag> <hash>] [{<tag> value} - (n.* <factor> (# (<hash> super) hash value))]) + (n.* <factor> (at (<hash> super) hash value))]) ([2 #Branch ..branch_hash] [3 #Loop ..loop_hash] [5 #Function ..function_hash]) @@ -675,7 +675,7 @@ (case [reference sample] (^.template [<tag> <equivalence>] [[{<tag> reference'} {<tag> sample'}] - (# <equivalence> = reference' sample')]) + (at <equivalence> = reference' sample')]) ([#Simple /simple.equivalence] [#Structure (analysis/complex.equivalence =)] [#Reference reference.equivalence] @@ -699,7 +699,7 @@ (case value (^.template [<tag> <hash>] [{<tag> value} - (# <hash> hash value)]) + (at <hash> hash value)]) ([#Simple /simple.hash] [#Structure (analysis/complex.hash again_hash)] [#Reference reference.hash] diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/synthesis/access.lux b/stdlib/source/library/lux/tool/compiler/language/lux/synthesis/access.lux index 55750f9e1..3d211344f 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/synthesis/access.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/synthesis/access.lux @@ -35,4 +35,4 @@ (def: .public equivalence (Equivalence Access) - (# ..hash equivalence)) + (at ..hash equivalence)) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/synthesis/access/member.lux b/stdlib/source/library/lux/tool/compiler/language/lux/synthesis/access/member.lux index 683be67f9..9c06a680a 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/synthesis/access/member.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/synthesis/access/member.lux @@ -31,4 +31,4 @@ (def: .public equivalence (Equivalence Member) - (# ..hash equivalence)) + (at ..hash equivalence)) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/synthesis/access/side.lux b/stdlib/source/library/lux/tool/compiler/language/lux/synthesis/access/side.lux index 8b3c71bee..0ba13495a 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/synthesis/access/side.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/synthesis/access/side.lux @@ -31,4 +31,4 @@ (def: .public equivalence (Equivalence Side) - (# ..hash equivalence)) + (at ..hash equivalence)) diff --git a/stdlib/source/library/lux/tool/compiler/language/lux/synthesis/simple.lux b/stdlib/source/library/lux/tool/compiler/language/lux/synthesis/simple.lux index 17419d58f..a0fdb6e67 100644 --- a/stdlib/source/library/lux/tool/compiler/language/lux/synthesis/simple.lux +++ b/stdlib/source/library/lux/tool/compiler/language/lux/synthesis/simple.lux @@ -66,7 +66,7 @@ (|>> (pipe.case (^.template [<factor> <tag> <hash>] [{<tag> value'} - (n.* <factor> (# <hash> hash value'))]) + (n.* <factor> (at <hash> hash value'))]) ([2 #Bit bit.hash] [3 #F64 f.hash] [5 #Text text.hash] diff --git a/stdlib/source/library/lux/tool/compiler/meta/archive.lux b/stdlib/source/library/lux/tool/compiler/meta/archive.lux index b88b57053..cf56ab7f3 100644 --- a/stdlib/source/library/lux/tool/compiler/meta/archive.lux +++ b/stdlib/source/library/lux/tool/compiler/meta/archive.lux @@ -138,7 +138,7 @@ (the #resolver) dictionary.entries (list.all (function (_ [module [module_id entry]]) - (# maybe.monad each (|>> [module_id] [module]) entry))))) + (at maybe.monad each (|>> [module_id] [module]) entry))))) (def: .public (find module archive) (-> descriptor.Module Archive (Try (Entry Any))) diff --git a/stdlib/source/library/lux/tool/compiler/meta/archive/artifact/category.lux b/stdlib/source/library/lux/tool/compiler/meta/archive/artifact/category.lux index 146b2d12d..d6dc3c74f 100644 --- a/stdlib/source/library/lux/tool/compiler/meta/archive/artifact/category.lux +++ b/stdlib/source/library/lux/tool/compiler/meta/archive/artifact/category.lux @@ -49,7 +49,7 @@ true [{#Definition left} {#Definition right}] - (# definition_equivalence = left right) + (at definition_equivalence = left right) (^.template [<tag>] [[{<tag> left} {<tag> right}] diff --git a/stdlib/source/library/lux/tool/compiler/meta/archive/module/descriptor.lux b/stdlib/source/library/lux/tool/compiler/meta/archive/module/descriptor.lux index 8cb500cc6..dade0e5d8 100644 --- a/stdlib/source/library/lux/tool/compiler/meta/archive/module/descriptor.lux +++ b/stdlib/source/library/lux/tool/compiler/meta/archive/module/descriptor.lux @@ -77,6 +77,6 @@ <binary>.text <binary>.text <binary>.nat - (# <>.monad in {.#Cached}) + (at <>.monad in {.#Cached}) (<binary>.set text.hash <binary>.text) )) diff --git a/stdlib/source/library/lux/tool/compiler/meta/archive/module/document.lux b/stdlib/source/library/lux/tool/compiler/meta/archive/module/document.lux index 7f0f4faeb..30404cc59 100644 --- a/stdlib/source/library/lux/tool/compiler/meta/archive/module/document.lux +++ b/stdlib/source/library/lux/tool/compiler/meta/archive/module/document.lux @@ -33,9 +33,9 @@ (def: .public (content key document) (All (_ d) (-> (Key d) (Document Any) (Try d))) (let [[document//signature document//content] (representation document)] - (if (# signature.equivalence = - (key.signature key) - document//signature) + (if (at signature.equivalence = + (key.signature key) + document//signature) {try.#Success (sharing [e] (Key e) key diff --git a/stdlib/source/library/lux/tool/compiler/meta/archive/registry.lux b/stdlib/source/library/lux/tool/compiler/meta/archive/registry.lux index 3b849a479..7206a2f6c 100644 --- a/stdlib/source/library/lux/tool/compiler/meta/archive/registry.lux +++ b/stdlib/source/library/lux/tool/compiler/meta/archive/registry.lux @@ -166,7 +166,7 @@ (case tag (^.template [<nat> <tag> <parser>] [<nat> - (# ! each (|>> {<tag>}) <parser>)]) + (at ! each (|>> {<tag>}) <parser>)]) ([0 //category.#Anonymous <binary>.any] [1 //category.#Definition definition] [2 //category.#Analyser <binary>.text] @@ -182,21 +182,21 @@ dependencies (is (Parser (Set unit.ID)) (<binary>.set unit.hash dependency))] (|> (<binary>.sequence_64 (all <>.and category mandatory? dependencies)) - (# <>.monad each (sequence#mix (function (_ [category mandatory? dependencies] registry) - (product.right - (case category - {//category.#Anonymous} - (..resource mandatory? dependencies registry) + (at <>.monad each (sequence#mix (function (_ [category mandatory? dependencies] registry) + (product.right + (case category + {//category.#Anonymous} + (..resource mandatory? dependencies registry) - (^.template [<tag> <create>] - [{<tag> name} - (<create> name mandatory? dependencies registry)]) - ([//category.#Definition ..definition] - [//category.#Analyser ..analyser] - [//category.#Synthesizer ..synthesizer] - [//category.#Generator ..generator] - [//category.#Directive ..directive] - [//category.#Custom ..custom]) - ))) - ..empty))))) + (^.template [<tag> <create>] + [{<tag> name} + (<create> name mandatory? dependencies registry)]) + ([//category.#Definition ..definition] + [//category.#Analyser ..analyser] + [//category.#Synthesizer ..synthesizer] + [//category.#Generator ..generator] + [//category.#Directive ..directive] + [//category.#Custom ..custom]) + ))) + ..empty))))) ) diff --git a/stdlib/source/library/lux/tool/compiler/meta/archive/unit.lux b/stdlib/source/library/lux/tool/compiler/meta/archive/unit.lux index 2af463186..db55f4e1f 100644 --- a/stdlib/source/library/lux/tool/compiler/meta/archive/unit.lux +++ b/stdlib/source/library/lux/tool/compiler/meta/archive/unit.lux @@ -30,7 +30,7 @@ (def: .public equivalence (Equivalence ID) - (# ..hash equivalence)) + (at ..hash equivalence)) (def: .public none (Set ID) diff --git a/stdlib/source/library/lux/tool/compiler/meta/cache.lux b/stdlib/source/library/lux/tool/compiler/meta/cache.lux index f3b0380b7..da7a95abf 100644 --- a/stdlib/source/library/lux/tool/compiler/meta/cache.lux +++ b/stdlib/source/library/lux/tool/compiler/meta/cache.lux @@ -17,14 +17,14 @@ (def: .public (path fs context) (All (_ !) (-> (file.System !) Context file.Path)) - (let [/ (# fs separator)] + (let [/ (at fs separator)] (format (the context.#target context) / (the context.#host context) / (version.format //.version)))) (def: .public (enabled? fs context) (All (_ !) (-> (file.System !) Context (! Bit))) - (# fs directory? (..path fs context))) + (at fs directory? (..path fs context))) (def: .public (enable! ! fs context) (All (_ !) (-> (Monad !) (file.System !) Context (! (Try Any)))) diff --git a/stdlib/source/library/lux/tool/compiler/meta/cache/archive.lux b/stdlib/source/library/lux/tool/compiler/meta/cache/archive.lux index b1a331672..8a60f6d41 100644 --- a/stdlib/source/library/lux/tool/compiler/meta/cache/archive.lux +++ b/stdlib/source/library/lux/tool/compiler/meta/cache/archive.lux @@ -16,9 +16,9 @@ (def: .public (descriptor fs context) (All (_ !) (-> (file.System !) Context file.Path)) (%.format (//.path fs context) - (# fs separator) + (at fs separator) "descriptor")) (def: .public (cache! fs context it) (All (_ !) (-> (file.System !) Context Archive (! (Try Any)))) - (# fs write (..descriptor fs context) (archive.export ///.version it))) + (at fs write (..descriptor fs context) (archive.export ///.version it))) diff --git a/stdlib/source/library/lux/tool/compiler/meta/cache/artifact.lux b/stdlib/source/library/lux/tool/compiler/meta/cache/artifact.lux index 9ea2a1dd3..66e347398 100644 --- a/stdlib/source/library/lux/tool/compiler/meta/cache/artifact.lux +++ b/stdlib/source/library/lux/tool/compiler/meta/cache/artifact.lux @@ -24,16 +24,16 @@ (All (_ !) (-> (file.System !) Context module.ID artifact.ID file.Path)) (format (//module.path fs context @module) - (# fs separator) + (at fs separator) (%.nat @artifact) (the context.#artifact_extension context))) (def: .public (cache fs context @module @artifact) (All (_ !) (-> (file.System !) Context module.ID artifact.ID (! (Try Binary)))) - (# fs read (..path fs context @module @artifact))) + (at fs read (..path fs context @module @artifact))) (def: .public (cache! fs context @module @artifact content) (All (_ !) (-> (file.System !) Context module.ID artifact.ID Binary (! (Try Any)))) - (# fs write (..path fs context @module @artifact) content)) + (at fs write (..path fs context @module @artifact) content)) diff --git a/stdlib/source/library/lux/tool/compiler/meta/cache/dependency/artifact.lux b/stdlib/source/library/lux/tool/compiler/meta/cache/dependency/artifact.lux index 8008fe5a6..6e5f46df9 100644 --- a/stdlib/source/library/lux/tool/compiler/meta/cache/dependency/artifact.lux +++ b/stdlib/source/library/lux/tool/compiler/meta/cache/dependency/artifact.lux @@ -171,7 +171,7 @@ (set.of_list symbol.hash) set.list (monad.each ! (generation.remember archive)) - (# ! each (set.of_list unit.hash))))) + (at ! each (set.of_list unit.hash))))) (def: .public (path_dependencies archive value) (All (_ anchor expression directive) @@ -182,7 +182,7 @@ (set.of_list symbol.hash) set.list (monad.each ! (generation.remember archive)) - (# ! each (set.of_list unit.hash))))) + (at ! each (set.of_list unit.hash))))) (def: .public all (-> (List (Set unit.ID)) diff --git a/stdlib/source/library/lux/tool/compiler/meta/cache/module.lux b/stdlib/source/library/lux/tool/compiler/meta/cache/module.lux index 9a4ed2e1b..603aa2ffd 100644 --- a/stdlib/source/library/lux/tool/compiler/meta/cache/module.lux +++ b/stdlib/source/library/lux/tool/compiler/meta/cache/module.lux @@ -35,18 +35,18 @@ (def: .public (path fs context @module) (All (_ !) (-> (file.System !) Context module.ID file.Path)) (format (//.path fs context) - (# fs separator) + (at fs separator) (%.nat @module))) (def: .public (enabled? fs context @module) (All (_ !) (-> (file.System !) Context module.ID (! Bit))) - (# fs directory? (..path fs context @module))) + (at fs directory? (..path fs context @module))) (def: .public (enable! ! fs context @module) (All (_ !) (-> (Monad !) (file.System !) Context module.ID (! (Try Any)))) (do ! [.let [path (..path fs context @module)] - module_exists? (# fs directory? path)] + module_exists? (at fs directory? path)] (if module_exists? (in {try.#Success []}) (with_expansions [<failure> (exception.except ..cannot_enable [(//.path fs context) @@ -60,13 +60,13 @@ success (|> path - (# fs make_directory) - (# ! each (|>> (pipe.case - {try.#Failure error} - <failure> + (at fs make_directory) + (at ! each (|>> (pipe.case + {try.#Failure error} + <failure> - success - success)))))))))) + success + success)))))))))) (def: file file.Path @@ -75,28 +75,28 @@ (def: .public (descriptor fs context @module) (All (_ !) (-> (file.System !) Context module.ID file.Path)) (format (..path fs context @module) - (# fs separator) + (at fs separator) ..file)) (def: .public (cache! fs context @module content) (All (_ !) (-> (file.System !) Context module.ID Binary (! (Try Any)))) - (# fs write (..descriptor fs context @module) content)) + (at fs write (..descriptor fs context @module) content)) (def: .public (cache fs context @module) (All (_ !) (-> (file.System !) Context module.ID (! (Try Binary)))) - (# fs read (..descriptor fs context @module))) + (at fs read (..descriptor fs context @module))) (def: .public (artifacts ! fs context @module) (All (_ !) (-> (Monad !) (file.System !) Context module.ID (! (Try (Dictionary Text Binary))))) (do [! (try.with !)] - [files (# fs directory_files (..path fs context @module)) + [files (at fs directory_files (..path fs context @module)) pairs (|> files (list#each (function (_ file) [(file.name fs file) file])) (list.only (|>> product.left (text#= ..file) not)) (monad.each ! (function (_ [name path]) (|> path - (# fs read) - (# ! each (|>> [name]))))))] + (at fs read) + (at ! each (|>> [name]))))))] (in (dictionary.of_list text.hash (for @.old (as (List [Text Binary]) pairs) pairs))))) diff --git a/stdlib/source/library/lux/tool/compiler/meta/cache/purge.lux b/stdlib/source/library/lux/tool/compiler/meta/cache/purge.lux index 6ccdcdd56..addb97821 100644 --- a/stdlib/source/library/lux/tool/compiler/meta/cache/purge.lux +++ b/stdlib/source/library/lux/tool/compiler/meta/cache/purge.lux @@ -43,10 +43,10 @@ (do [! (try.with async.monad)] [.let [cache (//module.path fs context @module)] _ (|> cache - (# fs directory_files) - (# ! each (monad.each ! (# fs delete))) - (# ! conjoint))] - (# fs delete cache))) + (at fs directory_files) + (at ! each (monad.each ! (at fs delete))) + (at ! conjoint))] + (at fs delete cache))) (def: .public (valid? expected actual) (-> Descriptor Input Bit) diff --git a/stdlib/source/library/lux/tool/compiler/meta/export.lux b/stdlib/source/library/lux/tool/compiler/meta/export.lux index 21c75e46c..5446de96d 100644 --- a/stdlib/source/library/lux/tool/compiler/meta/export.lux +++ b/stdlib/source/library/lux/tool/compiler/meta/export.lux @@ -53,7 +53,7 @@ (function (_ [path source_code]) (do try.monad [path (|> path - (text.replaced (# fs separator) .module_separator) + (text.replaced (at fs separator) .module_separator) tar.path)] (try#each (|>> [path (instant.of_millis +0) @@ -69,6 +69,6 @@ (do [! (try.with async.monad)] [tar (|> sources (..library fs) - (# ! each (binary.result tar.writer))) - .let [/ (# fs separator)]] - (# fs write (format target / ..file) tar))) + (at ! each (binary.result tar.writer))) + .let [/ (at fs separator)]] + (at fs write (format target / ..file) tar))) diff --git a/stdlib/source/library/lux/tool/compiler/meta/import.lux b/stdlib/source/library/lux/tool/compiler/meta/import.lux index 5c5be37d4..b752d9f2f 100644 --- a/stdlib/source/library/lux/tool/compiler/meta/import.lux +++ b/stdlib/source/library/lux/tool/compiler/meta/import.lux @@ -44,26 +44,26 @@ (-> (file.System Async) Library Import (Action Import)) (let [! async.monad] (|> library - (# system read) - (# ! each (let [! try.monad] - (|>> (# ! each (<binary>.result tar.parser)) - (# ! conjoint) - (# ! each (|>> sequence.list - (monad.mix ! (function (_ entry import) - (case entry - {tar.#Normal [path instant mode ownership content]} - (let [path (tar.from_path path)] - (case (dictionary.has' path (tar.data content) import) - {try.#Failure error} - (exception.except ..duplicate [library path]) + (at system read) + (at ! each (let [! try.monad] + (|>> (at ! each (<binary>.result tar.parser)) + (at ! conjoint) + (at ! each (|>> sequence.list + (monad.mix ! (function (_ entry import) + (case entry + {tar.#Normal [path instant mode ownership content]} + (let [path (tar.from_path path)] + (case (dictionary.has' path (tar.data content) import) + {try.#Failure error} + (exception.except ..duplicate [library path]) - import' - import')) - - _ - (exception.except ..useless_tar_entry []))) - import))) - (# ! conjoint))))))) + import' + import')) + + _ + (exception.except ..useless_tar_entry []))) + import))) + (at ! conjoint))))))) (def: .public (import system libraries) (-> (file.System Async) (List Library) (Action Import)) diff --git a/stdlib/source/library/lux/tool/compiler/meta/io.lux b/stdlib/source/library/lux/tool/compiler/meta/io.lux index 0ad226608..efbdb599d 100644 --- a/stdlib/source/library/lux/tool/compiler/meta/io.lux +++ b/stdlib/source/library/lux/tool/compiler/meta/io.lux @@ -14,7 +14,7 @@ (def: .public (safe system) (All (_ m) (-> (System m) Text Text)) - (text.replaced "/" (# system separator))) + (text.replaced "/" (at system separator))) (def: .public lux_context Context diff --git a/stdlib/source/library/lux/tool/compiler/meta/io/archive.lux b/stdlib/source/library/lux/tool/compiler/meta/io/archive.lux index 435a8d3fb..ff44f3258 100644 --- a/stdlib/source/library/lux/tool/compiler/meta/io/archive.lux +++ b/stdlib/source/library/lux/tool/compiler/meta/io/archive.lux @@ -125,12 +125,12 @@ (case (do ! [data (try.of_maybe (dictionary.value (format (%.nat @artifact) extension) actual)) .let [context [@module @artifact] - directive (# host ingest context data)]] + directive (at host ingest context data)]] (case artifact_category {category.#Anonymous} (do ! [.let [output (sequence.suffix [@artifact {.#None} data] output)] - _ (# host re_learn context {.#None} directive)] + _ (at host re_learn context {.#None} directive)] (in [definitions [analysers synthesizers @@ -148,7 +148,7 @@ directives] output]) (do ! - [value (# host re_load context {.#None} directive)] + [value (at host re_load context {.#None} directive)] (in [(dictionary.has name value definitions) [analysers synthesizers @@ -159,7 +159,7 @@ {category.#Analyser extension} (do ! [.let [output (sequence.suffix [@artifact {.#None} data] output)] - value (# host re_load context {.#None} directive)] + value (at host re_load context {.#None} directive)] (in [definitions [(dictionary.has extension (as analysis.Handler value) analysers) synthesizers @@ -170,7 +170,7 @@ {category.#Synthesizer extension} (do ! [.let [output (sequence.suffix [@artifact {.#None} data] output)] - value (# host re_load context {.#None} directive)] + value (at host re_load context {.#None} directive)] (in [definitions [analysers (dictionary.has extension (as synthesis.Handler value) synthesizers) @@ -181,7 +181,7 @@ {category.#Generator extension} (do ! [.let [output (sequence.suffix [@artifact {.#None} data] output)] - value (# host re_load context {.#None} directive)] + value (at host re_load context {.#None} directive)] (in [definitions [analysers synthesizers @@ -192,7 +192,7 @@ {category.#Directive extension} (do ! [.let [output (sequence.suffix [@artifact {.#None} data] output)] - value (# host re_load context {.#None} directive)] + value (at host re_load context {.#None} directive)] (in [definitions [analysers synthesizers @@ -203,7 +203,7 @@ {category.#Custom name} (do ! [.let [output (sequence.suffix [@artifact {.#Some name} data] output)] - _ (# host re_learn context {.#Some name} directive)] + _ (at host re_learn context {.#Some name} directive)] (in [definitions [analysers synthesizers @@ -232,16 +232,16 @@ (|> definitions (dictionary.value def_name) try.of_maybe - (# ! each (|>> [exported? type] - {.#Definition} - [def_name]))) + (at ! each (|>> [exported? type] + {.#Definition} + [def_name]))) {.#Type [exported? _ labels]} (|> definitions (dictionary.value def_name) try.of_maybe - (# ! each (function (_ def_value) - [def_name {.#Type [exported? (as .Type def_value) labels]}]))))) + (at ! each (function (_ def_value) + [def_name {.#Type [exported? (as .Type def_value) labels]}]))))) (the .#definitions content))] (in [(document.document $.key (has .#definitions definitions content)) bundles]))) @@ -318,8 +318,8 @@ archive.#registry registry] archive)) archive) - (# try.monad each (dependency.load_order $.key)) - (# try.monad conjoint))) + (at try.monad each (dependency.load_order $.key)) + (at try.monad conjoint))) (def: (loaded_caches host_environment fs context purge load_order) (All (_ expression directive) @@ -379,7 +379,7 @@ (-> (List Custom) Configuration (generation.Host expression directive) (file.System Async) Context Import (List //.Context) (Async (Try [Archive .Lux Bundles])))) (do async.monad - [binary (# fs read (cache/archive.descriptor fs context))] + [binary (at fs read (cache/archive.descriptor fs context))] (case binary {try.#Success binary} (do (try.with async.monad) diff --git a/stdlib/source/library/lux/tool/compiler/meta/io/context.lux b/stdlib/source/library/lux/tool/compiler/meta/io/context.lux index 96e91fbd6..4122a31ad 100644 --- a/stdlib/source/library/lux/tool/compiler/meta/io/context.lux +++ b/stdlib/source/library/lux/tool/compiler/meta/io/context.lux @@ -51,7 +51,7 @@ (All (_ m) (-> (file.System m) Context Module file.Path)) (|> module (//.safe fs) - (format context (# fs separator)))) + (format context (at fs separator)))) (def: (find_source_file fs importer contexts module extension) (-> (file.System Async) Module (List Context) Module Extension @@ -63,7 +63,7 @@ {.#Item context contexts'} (let [path (format (..path fs context module) extension)] (do async.monad - [? (# fs file? path)] + [? (at fs file? path)] (if ? (in {try.#Success path}) (find_source_file fs importer contexts' module extension)))))) @@ -82,15 +82,15 @@ (case outcome {try.#Success path} (|> path - (# fs read) - (# (try.with !) each (|>> [path]))) + (at fs read) + (at (try.with !) each (|>> [path]))) {try.#Failure _} (do [! (try.with !)] [path (..find_source_file fs importer contexts module ..lux_extension)] (|> path - (# fs read) - (# ! each (|>> [path]))))))) + (at fs read) + (at ! each (|>> [path]))))))) (def: (find_library_source_file importer import partial_host_extension module) (-> Module Import Extension Module (Try [file.Path Binary])) @@ -127,7 +127,7 @@ (Async (Try Input))) (do (try.with async.monad) [[path binary] (..find_any_source_file fs importer import contexts partial_host_extension module)] - (case (# utf8.codec decoded binary) + (case (at utf8.codec decoded binary) {try.#Success code} (in [////.#module module ////.#file path @@ -144,19 +144,19 @@ (-> (file.System Async) Context file.Path Enumeration (Async (Try Enumeration))) (do [! (try.with async.monad)] [enumeration (|> directory - (# fs directory_files) - (# ! each (monad.mix ! (function (_ file enumeration) - (if (text.ends_with? ..lux_extension file) - (do ! - [source_code (# fs read file)] - (async#in (dictionary.has' (text.replaced_once context "" file) source_code enumeration))) - (in enumeration))) - enumeration)) - (# ! conjoint))] + (at fs directory_files) + (at ! each (monad.mix ! (function (_ file enumeration) + (if (text.ends_with? ..lux_extension file) + (do ! + [source_code (at fs read file)] + (async#in (dictionary.has' (text.replaced_once context "" file) source_code enumeration))) + (in enumeration))) + enumeration)) + (at ! conjoint))] (|> directory - (# fs sub_directories) - (# ! each (monad.mix ! (context_listing fs context) enumeration)) - (# ! conjoint)))) + (at fs sub_directories) + (at ! each (monad.mix ! (context_listing fs context) enumeration)) + (at ! conjoint)))) (def: Action (type (All (_ a) (Async (Try a))))) @@ -164,7 +164,7 @@ (def: (canonical fs context) (-> (file.System Async) Context (Action Context)) (do (try.with async.monad) - [subs (# fs sub_directories context)] + [subs (at fs sub_directories context)] (in (|> subs list.head (maybe.else context) @@ -180,7 +180,7 @@ (do ! [context (..canonical fs context)] (..context_listing fs - (format context (# fs separator)) + (format context (at fs separator)) context enumeration))) (is Enumeration diff --git a/stdlib/source/library/lux/tool/compiler/meta/packager/jvm.lux b/stdlib/source/library/lux/tool/compiler/meta/packager/jvm.lux index 63df754f0..545b80f70 100644 --- a/stdlib/source/library/lux/tool/compiler/meta/packager/jvm.lux +++ b/stdlib/source/library/lux/tool/compiler/meta/packager/jvm.lux @@ -177,7 +177,7 @@ (function (_ [artifact custom content] sink) (if (set.member? necessary_dependencies [module artifact]) (..write_class static module artifact custom content sink) - (# ! in sink))) + (at ! in sink))) sink (sequence.list output)))) diff --git a/stdlib/source/library/lux/tool/compiler/meta/packager/ruby.lux b/stdlib/source/library/lux/tool/compiler/meta/packager/ruby.lux index 1fbd7ddc9..3c4b1abbb 100644 --- a/stdlib/source/library/lux/tool/compiler/meta/packager/ruby.lux +++ b/stdlib/source/library/lux/tool/compiler/meta/packager/ruby.lux @@ -60,15 +60,15 @@ [bundle (monad.mix ! (function (_ [artifact custom_name content] so_far) (|> content - (# utf8.codec decoded) - (# ! each - (|>> as_expected - (sharing [directive] - directive - so_far - - directive) - (_.then so_far))))) + (at utf8.codec decoded) + (at ! each + (|>> as_expected + (sharing [directive] + directive + so_far + + directive) + (_.then so_far))))) (_.comment "Lux module" (_.statement (_.string ""))) artifacts)] @@ -95,7 +95,7 @@ (list#mix _.then bundle) (is _.Statement) _.code - (# utf8.codec encoded))] + (at utf8.codec encoded))] (in (partial_list [module_id [(..module_file module_id) entry_content]] sink)))))) @@ -133,7 +133,7 @@ (_.statement (_.string "")))) (is _.Statement) _.code - (# utf8.codec encoded))]] + (at utf8.codec encoded))]] (in (|> entries (list#each product.right) {.#Item [..main_file imports]} diff --git a/stdlib/source/library/lux/tool/compiler/meta/packager/scheme.lux b/stdlib/source/library/lux/tool/compiler/meta/packager/scheme.lux index d99635b00..c408bb291 100644 --- a/stdlib/source/library/lux/tool/compiler/meta/packager/scheme.lux +++ b/stdlib/source/library/lux/tool/compiler/meta/packager/scheme.lux @@ -61,15 +61,15 @@ (monad.mix try.monad (function (_ content so_far) (|> content - (# encoding.utf8 decoded) - (# try.monad each - (|>> as_expected - (sharing [directive] - directive - so_far - - directive) - (..then so_far))))) + (at encoding.utf8 decoded) + (at try.monad each + (|>> as_expected + (sharing [directive] + directive + so_far + + directive) + (..then so_far))))) (is _.Expression (_.manual ""))))) (def: module_file @@ -111,7 +111,7 @@ (list#mix ..then bundle) (is _.Expression) _.code - (# encoding.utf8 encoded) + (at encoding.utf8 encoded) tar.content)) module_file (tar.path (..module_file module_id))] (in {tar.#Normal [module_file now ..mode ..ownership entry_content]}))) diff --git a/stdlib/source/library/lux/tool/compiler/meta/packager/script.lux b/stdlib/source/library/lux/tool/compiler/meta/packager/script.lux index 9c140909d..ddb0ff4cd 100644 --- a/stdlib/source/library/lux/tool/compiler/meta/packager/script.lux +++ b/stdlib/source/library/lux/tool/compiler/meta/packager/script.lux @@ -47,15 +47,15 @@ (monad.mix try.monad (function (_ content so_far) (|> content - (# utf8.codec decoded) - (# try.monad each - (|>> as_expected - (sharing [directive] - directive - so_far - - directive) - (sequence so_far))))) + (at utf8.codec decoded) + (at try.monad each + (|>> as_expected + (sharing [directive] + directive + so_far + + directive) + (sequence so_far))))) so_far))) (def: .public (package header code sequence scope) @@ -73,7 +73,7 @@ (list#each (function (_ [module [module_id entry]]) [module_id (the archive.#output entry)])) (monad.mix ! (..write_module necessary_dependencies sequence) header) - (# ! each (|>> scope - code - (# utf8.codec encoded) - {.#Left})))))) + (at ! each (|>> scope + code + (at utf8.codec encoded) + {.#Left})))))) diff --git a/stdlib/source/library/lux/tool/compiler/phase.lux b/stdlib/source/library/lux/tool/compiler/phase.lux index 213d40339..e3cf241ba 100644 --- a/stdlib/source/library/lux/tool/compiler/phase.lux +++ b/stdlib/source/library/lux/tool/compiler/phase.lux @@ -69,7 +69,7 @@ (-> s (Operation s o) (Try o))) (|> state operation - (# try.monad each product.right))) + (at try.monad each product.right))) (def: .public state (All (_ s o) @@ -108,7 +108,7 @@ (template: .public (assertion exception message test) [(if test - (# ..monad in []) + (at ..monad in []) (..except exception message))]) (def: .public identity diff --git a/stdlib/source/library/lux/tool/compiler/reference.lux b/stdlib/source/library/lux/tool/compiler/reference.lux index 6c6b7aca1..c20c13688 100644 --- a/stdlib/source/library/lux/tool/compiler/reference.lux +++ b/stdlib/source/library/lux/tool/compiler/reference.lux @@ -34,7 +34,7 @@ (case [reference sample] (^.template [<tag> <equivalence>] [[{<tag> reference} {<tag> sample}] - (# <equivalence> = reference sample)]) + (at <equivalence> = reference sample)]) ([#Variable /variable.equivalence] [#Constant symbol.equivalence]) @@ -52,7 +52,7 @@ (^.template [<factor> <tag> <hash>] [{<tag> value} (|> value - (# <hash> hash) + (at <hash> hash) (n.* <factor>))]) ([2 #Variable /variable.hash] [3 #Constant symbol.hash]) diff --git a/stdlib/source/library/lux/tool/compiler/reference/variable.lux b/stdlib/source/library/lux/tool/compiler/reference/variable.lux index 9978193d7..488901fff 100644 --- a/stdlib/source/library/lux/tool/compiler/reference/variable.lux +++ b/stdlib/source/library/lux/tool/compiler/reference/variable.lux @@ -48,7 +48,7 @@ (^.template [<factor> <tag>] [{<tag> register} (|> register - (# n.hash hash) + (at n.hash hash) (n.* <factor>))]) ([2 #Local] [3 #Foreign]))))) |