aboutsummaryrefslogtreecommitdiff
path: root/stdlib/source/lux/tool
diff options
context:
space:
mode:
authorEduardo Julian2020-12-01 09:27:58 -0400
committerEduardo Julian2020-12-01 09:27:58 -0400
commitcfa0a075b89a0df4618e7009f05c157393cbba72 (patch)
tree4bb658a44cfade42e27f9f6bf87d7118c69af6e0 /stdlib/source/lux/tool
parent7444deb1b80d469280fcb0684d91c13f752a86d6 (diff)
Added specialized root/2 and root/3 functions in lux/math.
Diffstat (limited to 'stdlib/source/lux/tool')
-rw-r--r--stdlib/source/lux/tool/compiler/language/lux/phase/extension/bundle.lux4
-rw-r--r--stdlib/source/lux/tool/compiler/language/lux/phase/generation/jvm/reference.lux4
-rw-r--r--stdlib/source/lux/tool/compiler/language/lux/phase/generation/scheme.lux4
-rw-r--r--stdlib/source/lux/tool/compiler/language/lux/phase/generation/scheme/extension/common.lux4
-rw-r--r--stdlib/source/lux/tool/compiler/language/lux/phase/generation/scheme/function.lux10
-rw-r--r--stdlib/source/lux/tool/compiler/language/lux/phase/generation/scheme/loop.lux4
-rw-r--r--stdlib/source/lux/tool/compiler/language/lux/phase/generation/scheme/runtime.lux18
-rw-r--r--stdlib/source/lux/tool/interpreter.lux4
8 files changed, 26 insertions, 26 deletions
diff --git a/stdlib/source/lux/tool/compiler/language/lux/phase/extension/bundle.lux b/stdlib/source/lux/tool/compiler/language/lux/phase/extension/bundle.lux
index 4816993f3..1004c55f8 100644
--- a/stdlib/source/lux/tool/compiler/language/lux/phase/extension/bundle.lux
+++ b/stdlib/source/lux/tool/compiler/language/lux/phase/extension/bundle.lux
@@ -6,7 +6,7 @@
["." text
["%" format (#+ format)]]
[collection
- ["." list ("#;." functor)]
+ ["." list ("#\." functor)]
["." dictionary (#+ Dictionary)]]]]
[// (#+ Handler Bundle)])
@@ -24,5 +24,5 @@
(All [s i o]
(-> Text (-> (Bundle s i o) (Bundle s i o))))
(|>> dictionary.entries
- (list;map (function (_ [key val]) [(format prefix " " key) val]))
+ (list\map (function (_ [key val]) [(format prefix " " key) val]))
(dictionary.from-list text.hash)))
diff --git a/stdlib/source/lux/tool/compiler/language/lux/phase/generation/jvm/reference.lux b/stdlib/source/lux/tool/compiler/language/lux/phase/generation/jvm/reference.lux
index 1d99c2736..e74488d08 100644
--- a/stdlib/source/lux/tool/compiler/language/lux/phase/generation/jvm/reference.lux
+++ b/stdlib/source/lux/tool/compiler/language/lux/phase/generation/jvm/reference.lux
@@ -19,7 +19,7 @@
[//
["." generation]
[///
- ["#" phase ("operation@." monad)]
+ ["#" phase ("operation\." monad)]
[reference
["." variable (#+ Register Variable)]]
[meta
@@ -53,7 +53,7 @@
(-> Archive Variable (Operation (Bytecode Any)))
(case variable
(#variable.Local variable)
- (operation@wrap (_.aload variable))
+ (operation\wrap (_.aload variable))
(#variable.Foreign variable)
(..foreign archive variable)))
diff --git a/stdlib/source/lux/tool/compiler/language/lux/phase/generation/scheme.lux b/stdlib/source/lux/tool/compiler/language/lux/phase/generation/scheme.lux
index 950b3b74b..d6d33999b 100644
--- a/stdlib/source/lux/tool/compiler/language/lux/phase/generation/scheme.lux
+++ b/stdlib/source/lux/tool/compiler/language/lux/phase/generation/scheme.lux
@@ -6,7 +6,7 @@
[runtime (#+ Phase)]
["." primitive]
["." structure]
- ["." reference ("#;." system)]
+ ["." reference ("#\." system)]
["." function]
["." case]
["." loop]
@@ -34,7 +34,7 @@
(structure.tuple generate members)
(#synthesis.Reference value)
- (reference;reference value)
+ (reference\reference value)
(^ (synthesis.branch/case case))
(case.case generate case)
diff --git a/stdlib/source/lux/tool/compiler/language/lux/phase/generation/scheme/extension/common.lux b/stdlib/source/lux/tool/compiler/language/lux/phase/generation/scheme/extension/common.lux
index 782838b92..f7f55e260 100644
--- a/stdlib/source/lux/tool/compiler/language/lux/phase/generation/scheme/extension/common.lux
+++ b/stdlib/source/lux/tool/compiler/language/lux/phase/generation/scheme/extension/common.lux
@@ -12,7 +12,7 @@
[number (#+ hex)
["f" frac]]
[collection
- ["." list ("#;." functor)]
+ ["." list ("#\." functor)]
["dict" dictionary (#+ Dictionary)]]]
["." macro (#+ with-gensyms)
["." code]
@@ -48,7 +48,7 @@
(^ (list (~+ g!input+)))
(do /////.monad
[(~+ (|> g!input+
- (list;map (function (_ g!input)
+ (list\map (function (_ g!input)
(list g!input (` ((~ g!phase) (~ g!input))))))
list.concat))]
((~' wrap) ((~ g!extension) [(~+ g!input+)])))
diff --git a/stdlib/source/lux/tool/compiler/language/lux/phase/generation/scheme/function.lux b/stdlib/source/lux/tool/compiler/language/lux/phase/generation/scheme/function.lux
index 2bf25cec9..7206c23d5 100644
--- a/stdlib/source/lux/tool/compiler/language/lux/phase/generation/scheme/function.lux
+++ b/stdlib/source/lux/tool/compiler/language/lux/phase/generation/scheme/function.lux
@@ -9,7 +9,7 @@
[text
["%" format (#+ format)]]
[collection
- ["." list ("#;." functor)]]]
+ ["." list ("#\." functor)]]]
[target
["_" scheme (#+ Expression Computation Var)]]]
["." // #_
@@ -18,7 +18,7 @@
["#." case]
["#/" //
["#." reference]
- ["#/" // ("#;." monad)
+ ["#/" // ("#\." monad)
["#/" // #_
[reference (#+ Register Variable)]
[arity (#+ Arity)]
@@ -37,7 +37,7 @@
(def: (with-closure function-name inits function-definition)
(-> Text (List Expression) Computation (Operation Computation))
- (////;wrap
+ (////\wrap
(case inits
#.Nil
function-definition
@@ -46,7 +46,7 @@
(let [@closure (_.var (format function-name "___CLOSURE"))]
(_.letrec (list [@closure
(_.lambda [(|> (list.enumeration inits)
- (list;map (|>> product.left ..capture)))
+ (list\map (|>> product.left ..capture)))
#.None]
function-definition)])
(_.apply/* @closure inits))))))
@@ -78,7 +78,7 @@
(<| (_.if (|> @num-args (_.=/2 arityO))
(<| (_.let (list [(//case.register 0) @function]))
(_.let-values (list [[(|> (list.indices arity)
- (list;map ..input))
+ (list\map ..input))
#.None]
(_.apply/2 (_.global "apply") (_.global "values") @curried)]))
bodyO))
diff --git a/stdlib/source/lux/tool/compiler/language/lux/phase/generation/scheme/loop.lux b/stdlib/source/lux/tool/compiler/language/lux/phase/generation/scheme/loop.lux
index b4a9943ec..053a32c15 100644
--- a/stdlib/source/lux/tool/compiler/language/lux/phase/generation/scheme/loop.lux
+++ b/stdlib/source/lux/tool/compiler/language/lux/phase/generation/scheme/loop.lux
@@ -8,7 +8,7 @@
[number
["n" nat]]
[collection
- ["." list ("#;." functor)]]]
+ ["." list ("#\." functor)]]]
[target
["_" scheme (#+ Computation Var)]]]
["." // #_
@@ -29,7 +29,7 @@
(generate bodyS))]
(wrap (_.letrec (list [@scope (_.lambda [(|> initsS+
list.enumeration
- (list;map (|>> product.left (n.+ start) //case.register)))
+ (list\map (|>> product.left (n.+ start) //case.register)))
#.None]
bodyO)])
(_.apply/* @scope initsO+)))))
diff --git a/stdlib/source/lux/tool/compiler/language/lux/phase/generation/scheme/runtime.lux b/stdlib/source/lux/tool/compiler/language/lux/phase/generation/scheme/runtime.lux
index 7c3c3975b..45dcd3eb2 100644
--- a/stdlib/source/lux/tool/compiler/language/lux/phase/generation/scheme/runtime.lux
+++ b/stdlib/source/lux/tool/compiler/language/lux/phase/generation/scheme/runtime.lux
@@ -4,14 +4,14 @@
[monad (#+ do)]]
[control
["." function]
- ["p" parser ("#;." monad)
+ ["p" parser ("#\." monad)
["s" code (#+ Parser)]]]
[data
[number (#+ hex)]
[text
["%" format (#+ format)]]
[collection
- ["." list ("#;." monad)]]]
+ ["." list ("#\." monad)]]]
[macro
["." code]
[syntax (#+ syntax:)]]
@@ -72,7 +72,7 @@
(def: declaration
(Parser [Text (List Text)])
- (p.either (p.and s.local-identifier (p;wrap (list)))
+ (p.either (p.and s.local-identifier (p\wrap (list)))
(s.form (p.and s.local-identifier (p.some s.local-identifier)))))
(syntax: (runtime: {[name args] declaration}
@@ -80,8 +80,8 @@
(let [implementation (code.local-identifier (format "@@" name))
runtime (format prefix "__" (/////name.normalize name))
@runtime (` (_.var (~ (code.text runtime))))
- argsC+ (list;map code.local-identifier args)
- argsLC+ (list;map (|>> /////name.normalize (format "LRV__") code.text (~) (_.var) (`))
+ argsC+ (list\map code.local-identifier args)
+ argsLC+ (list\map (|>> /////name.normalize (format "LRV__") code.text (~) (_.var) (`))
args)
declaration (` ((~ (code.local-identifier name))
(~+ argsC+)))
@@ -103,9 +103,9 @@
_
(` (let [(~+ (|> (list.zip/2 argsC+ argsLC+)
- (list;map (function (_ [left right])
+ (list\map (function (_ [left right])
(list left right)))
- list;join))]
+ list\join))]
(_.define-function (~ @runtime) [(list (~+ argsLC+)) #.None]
(~ definition))))))))))))
@@ -126,10 +126,10 @@
(syntax: #export (with-vars {vars (s.tuple (p.many s.local-identifier))}
body)
(wrap (list (` (let [(~+ (|> vars
- (list;map (function (_ var)
+ (list\map (function (_ var)
(list (code.local-identifier var)
(` (_.var (~ (code.text (format "LRV__" (/////name.normalize var)))))))))
- list;join))]
+ list\join))]
(~ body))))))
(runtime: (lux//try op)
diff --git a/stdlib/source/lux/tool/interpreter.lux b/stdlib/source/lux/tool/interpreter.lux
index efff99be8..a8c2fe0b6 100644
--- a/stdlib/source/lux/tool/interpreter.lux
+++ b/stdlib/source/lux/tool/interpreter.lux
@@ -5,7 +5,7 @@
["." try (#+ Try)]
["ex" exception (#+ exception:)]]
[data
- ["." text ("#;." equivalence)
+ ["." text ("#\." equivalence)
["%" format (#+ format)]]]
[type (#+ :share)
["." check]]
@@ -205,7 +205,7 @@
(:: Console<!> write "> "))
line (:: Console<!> read-line)]
(if (and (not multi-line?)
- (text;= ..exit-command line))
+ (text\= ..exit-command line))
(:: Console<!> write ..farewell-message)
(case (read-eval-print (update@ #source (add-line line) context))
(#try.Success [context' representation])