2014-11-01 23:54:48 +03:00
|
|
|
if(!exists("..readline..")) source("readline.r")
|
|
|
|
if(!exists("..types..")) source("types.r")
|
|
|
|
if(!exists("..reader..")) source("reader.r")
|
|
|
|
if(!exists("..printer..")) source("printer.r")
|
|
|
|
if(!exists("..env..")) source("env.r")
|
|
|
|
|
|
|
|
READ <- function(str) {
|
|
|
|
return(read_str(str))
|
|
|
|
}
|
|
|
|
|
|
|
|
eval_ast <- function(ast, env) {
|
2014-11-04 05:02:09 +03:00
|
|
|
if (.symbol_q(ast)) {
|
2014-11-01 23:54:48 +03:00
|
|
|
Env.get(env, ast)
|
|
|
|
} else if (.list_q(ast)) {
|
|
|
|
new.listl(lapply(ast, function(a) EVAL(a, env)))
|
|
|
|
} else if (.vector_q(ast)) {
|
|
|
|
new.vectorl(lapply(ast, function(a) EVAL(a, env)))
|
2014-11-04 06:19:13 +03:00
|
|
|
} else if (.hash_map_q(ast)) {
|
|
|
|
lst <- list()
|
|
|
|
for(k in ls(ast)) {
|
|
|
|
lst[[length(lst)+1]] = k
|
|
|
|
lst[[length(lst)+1]] = EVAL(ast[[k]], env)
|
|
|
|
}
|
|
|
|
new.hash_mapl(lst)
|
2014-11-01 23:54:48 +03:00
|
|
|
} else {
|
|
|
|
ast
|
|
|
|
}
|
|
|
|
}
|
|
|
|
|
|
|
|
EVAL <- function(ast, env) {
|
2014-11-03 06:32:33 +03:00
|
|
|
#cat("EVAL: ", .pr_str(ast,TRUE), "\n", sep="")
|
2014-11-01 23:54:48 +03:00
|
|
|
if (!.list_q(ast)) {
|
|
|
|
return(eval_ast(ast, env))
|
|
|
|
}
|
|
|
|
|
|
|
|
# apply list
|
2014-11-03 06:32:33 +03:00
|
|
|
switch(paste("l",length(ast),sep=""),
|
2014-11-01 23:54:48 +03:00
|
|
|
l0={ return(ast) },
|
2014-11-04 06:19:13 +03:00
|
|
|
l1={ a0 <- ast[[1]]; a1 <- NULL; a2 <- NULL },
|
2014-11-01 23:54:48 +03:00
|
|
|
l2={ a0 <- ast[[1]]; a1 <- ast[[2]]; a2 <- NULL },
|
2014-11-04 06:19:13 +03:00
|
|
|
{ a0 <- ast[[1]]; a1 <- ast[[2]]; a2 <- ast[[3]] })
|
2014-11-03 06:32:33 +03:00
|
|
|
a0sym <- as.character(a0)
|
|
|
|
if (a0sym == "def!") {
|
2014-11-01 23:54:48 +03:00
|
|
|
res <- EVAL(ast[[3]], env)
|
|
|
|
return(Env.set(env, a1, res))
|
2014-11-03 06:32:33 +03:00
|
|
|
} else if (a0sym == "let*") {
|
2014-11-01 23:54:48 +03:00
|
|
|
let_env <- new.Env(env)
|
|
|
|
for(i in seq(1,length(a1),2)) {
|
|
|
|
Env.set(let_env, a1[[i]], EVAL(a1[[i+1]], let_env))
|
|
|
|
}
|
|
|
|
return(EVAL(a2, let_env))
|
|
|
|
} else {
|
|
|
|
el <- eval_ast(ast, env)
|
|
|
|
f <- el[[1]]
|
2014-11-03 06:32:33 +03:00
|
|
|
return(do.call(f,slice(el,2)))
|
2014-11-01 23:54:48 +03:00
|
|
|
}
|
|
|
|
}
|
|
|
|
|
|
|
|
PRINT <- function(exp) {
|
|
|
|
return(.pr_str(exp, TRUE))
|
|
|
|
}
|
|
|
|
|
|
|
|
repl_env <- new.Env()
|
|
|
|
Env.set(repl_env, "+", function(a,b) a+b)
|
|
|
|
Env.set(repl_env, "-", function(a,b) a-b)
|
|
|
|
Env.set(repl_env, "*", function(a,b) a*b)
|
|
|
|
Env.set(repl_env, "/", function(a,b) a/b)
|
|
|
|
|
|
|
|
rep <- function(str) return(PRINT(EVAL(READ(str), repl_env)))
|
|
|
|
|
|
|
|
repeat {
|
|
|
|
line <- readline("user> ")
|
|
|
|
if (is.null(line)) { cat("\n"); break }
|
|
|
|
tryCatch({
|
|
|
|
cat(rep(line),"\n", sep="")
|
|
|
|
}, error=function(err) {
|
|
|
|
cat("Error: ", get_error(err),"\n", sep="")
|
|
|
|
})
|
|
|
|
# R debug/fatal with tracebacks:
|
|
|
|
#cat(rep(line),"\n", sep="")
|
|
|
|
}
|