update packages
This commit is contained in:
@@ -80,7 +80,7 @@
|
||||
.ess.helpLinks <- function(topic, package) {
|
||||
tryCatch(
|
||||
warning = function(...) NULL,
|
||||
error = function(...) NULL,
|
||||
error = function(...) NULL, # needs R >= 2.13.0
|
||||
{
|
||||
ast <- .ess.fetchParsedRd(topic, package)
|
||||
.ess.findLinks(ast)
|
||||
@@ -156,7 +156,7 @@
|
||||
}
|
||||
|
||||
.ess.strip.error <- function(msg, srcfile) {
|
||||
pattern <- paste0(srcfile, ":[0-9]+:[0-9]+: ")
|
||||
pattern <- paste(srcfile, ":[0-9]+:[0-9]+: ", sep = "")
|
||||
sub(pattern, "", msg)
|
||||
}
|
||||
|
||||
@@ -218,12 +218,12 @@ if(.ess.Rversion < "1.8")
|
||||
sink(getConnection(1))
|
||||
|
||||
on.exit({
|
||||
writeLines(paste0(sentinel, "-END"))
|
||||
writeLines(paste(sentinel, "-END", sep = ""))
|
||||
if (sinked)
|
||||
sink(NULL)
|
||||
})
|
||||
|
||||
writeLines(paste0(sentinel, "-START"))
|
||||
writeLines(paste(sentinel, "-START", sep = ""))
|
||||
|
||||
.ess.environment.state$env <- parent.frame()
|
||||
on.exit(.ess.environment.state$env <- NULL, add = TRUE)
|
||||
|
||||
@@ -11,7 +11,7 @@
|
||||
## load .base.R and all other files into ESSR environment; then attach ESSR
|
||||
.ess.ESSR.load <- function(dir) {
|
||||
|
||||
if (nzchar(Sys.getenv("ESSR_TEST_LOAD_ERROR")))
|
||||
if (Sys.getenv("ESSR_TEST_LOAD_ERROR") != "")
|
||||
stop('Loading failed with a nice message.')
|
||||
|
||||
Rver <- .ess.ESSR.get.rver()
|
||||
|
||||
@@ -158,7 +158,15 @@
|
||||
mode <- sapply(objs, data.class)
|
||||
length <- sapply(objs, length)
|
||||
size <- sapply(objs, function(obj) format(object.size(obj)))
|
||||
d <- data.frame(mode, length, size)
|
||||
rows <- sapply(objs,nrow)
|
||||
# sapply returns a list rather than a vector if there are NULLs eg nrow returns NULL for non-dataframes.
|
||||
# check if list, replace NULLS with NA and convert to vector
|
||||
if (is.list(rows)) {
|
||||
rows[sapply(rows,is.null)] <- NA
|
||||
rows <- unlist(rows)
|
||||
}
|
||||
|
||||
d <- data.frame(mode, length, rows, size)
|
||||
|
||||
var.names <- row.names(d)
|
||||
|
||||
|
||||
1058
lisp/ess/etc/all.txt
Normal file
1058
lisp/ess/etc/all.txt
Normal file
File diff suppressed because it is too large
Load Diff
80
lisp/ess/etc/func.sas
Normal file
80
lisp/ess/etc/func.sas
Normal file
@@ -0,0 +1,80 @@
|
||||
|
||||
|
||||
proc freq order=freq data=sashelp.vfunc;
|
||||
tables source fnctype fncprod;
|
||||
run;
|
||||
|
||||
/*
|
||||
title 'FNCPROD=B';
|
||||
proc print data=sashelp.vfunc;
|
||||
where fncname>' ' & FNCPROD='B';
|
||||
run;
|
||||
|
||||
title 'FNCPROD=X';
|
||||
proc print data=sashelp.vfunc;
|
||||
where fncname>' ' & FNCPROD='X';
|
||||
run;
|
||||
|
||||
title 'FNCPROD=T';
|
||||
proc print data=sashelp.vfunc;
|
||||
where fncname>' ' & FNCPROD='T';
|
||||
run;
|
||||
|
||||
title 'FNCPROD=I';
|
||||
proc print data=sashelp.vfunc;
|
||||
where fncname>' ' & FNCPROD='I';
|
||||
run;
|
||||
|
||||
endsas;
|
||||
*/
|
||||
|
||||
data vfunc;
|
||||
set sashelp.vfunc end=last;
|
||||
by fncname;
|
||||
where fncname>' ' & (fncprod='X' | source=fncprod='B');
|
||||
file "func.txt";
|
||||
|
||||
if _n_=1 then do;
|
||||
put ";; SAS functions found in sashelp.vfunc where fncprod='X' | source=fncprod='B'";
|
||||
end;
|
||||
|
||||
if last.fncname;
|
||||
|
||||
fncname=lowcase(fncname);
|
||||
|
||||
retain alpha 'abcdefghijklmnopqrstuvwxyz' prev 1;
|
||||
|
||||
format fncname $quote32.;
|
||||
|
||||
i=indexc(alpha, substr(fncname, 1, 1));
|
||||
|
||||
if i>prev then do;
|
||||
prev=i;
|
||||
put;
|
||||
end;
|
||||
|
||||
put fncname @;
|
||||
|
||||
if last then put;
|
||||
run;
|
||||
|
||||
data vfunc;
|
||||
set sashelp.vfunc end=last;
|
||||
by fncname;
|
||||
if last.fncname;
|
||||
|
||||
where fncname>' ' & (fncprod='X' | source=fncprod='B');
|
||||
file "check-func.sas";
|
||||
|
||||
fncname=trim(lowcase(fncname))||'();';
|
||||
|
||||
put fncname;
|
||||
run;
|
||||
|
||||
proc contents varnum;
|
||||
run;
|
||||
|
||||
proc print;
|
||||
var fncname;
|
||||
format fncname $quote32.;
|
||||
run;
|
||||
80
lisp/ess/etc/proc.sas
Normal file
80
lisp/ess/etc/proc.sas
Normal file
@@ -0,0 +1,80 @@
|
||||
|
||||
/*
|
||||
all.txt scraped from
|
||||
<https://documentation.sas.com/doc/en/pgmsascdc/9.4_3.5/allprodsproc/procedures.htm>;
|
||||
*/
|
||||
|
||||
data proc;
|
||||
length name $ 20;
|
||||
infile 'all.txt';
|
||||
|
||||
input name;
|
||||
|
||||
if length(name)>1 & name^='SAS';
|
||||
|
||||
if verify(name, 'ABCDEFGHIJKLMNOPQRSTUVWXYZ0123456789 ')=0;
|
||||
|
||||
name=lowcase(name);
|
||||
run;
|
||||
|
||||
proc sort nodupkey data=proc;
|
||||
by name;
|
||||
run;
|
||||
|
||||
data proc;
|
||||
set proc;
|
||||
by name;
|
||||
*these PROCs are not present on my system: YMMV;
|
||||
*if it starts with HP, then it requires the high-performance products;
|
||||
*where name not in:(
|
||||
'aggregation', 'appsrv',
|
||||
'compile',
|
||||
'db2ext', 'db2util', 'dmsrvadm', 'dmsrvdatasvc', 'dmsrvprocesssvc',
|
||||
'dqloclst', 'dqmatch', 'dqscheme',
|
||||
'gis',
|
||||
'hp',
|
||||
'imstat', 'imxfer', 'items',
|
||||
'lasr',
|
||||
'mddb',
|
||||
'optgraph',
|
||||
'pds', 'pdscopy',
|
||||
'quest',
|
||||
'rdc', 'rdpool', 'rdsec', 'recommend', 'release', 'risk',
|
||||
'source',
|
||||
'tapecopy', 'tapelabel',
|
||||
'vasmp'
|
||||
);
|
||||
run;
|
||||
|
||||
proc print;
|
||||
run;
|
||||
|
||||
data proc;
|
||||
set proc end=last;
|
||||
|
||||
file "proc.txt";
|
||||
|
||||
retain alpha 'abcdefghijklmnopqrstuvwxyz' prev 1;
|
||||
|
||||
format name $quote32.;
|
||||
|
||||
i=indexc(alpha, substr(name, 1, 1));
|
||||
|
||||
if i>prev then do;
|
||||
prev=i;
|
||||
put;
|
||||
end;
|
||||
|
||||
put name @;
|
||||
|
||||
if last then put;
|
||||
run;
|
||||
|
||||
data proc;
|
||||
length name $ 35;
|
||||
set proc end=last;
|
||||
format name;
|
||||
file "check-proc.sas";
|
||||
name='proc '||trim(name)||';run;quit;';
|
||||
put name;
|
||||
run;
|
||||
23
lisp/ess/etc/proc.txt
Normal file
23
lisp/ess/etc/proc.txt
Normal file
@@ -0,0 +1,23 @@
|
||||
"access" "aceclus" "adaptivereg" "aggregation" "anom" "anova" "append" "appsrv" "arima" "assess" "astore" "authlib" "autoreg"
|
||||
"bchoice" "bglimm" "binning" "bnet" "bom" "boolrule" "boxplot" "build"
|
||||
"calendar" "calis" "callrfc" "cancorr" "candisc" "capability" "cardinality" "carima" "cas" "casutil" "catalog" "catmod" "causalgraph" "causalmed" "causaltrt" "ccdm" "ccopula" "cesm" "chart" "cimport" "clp" "cluster" "cntselect" "compare" "compile" "computab" "contents" "convert" "copula" "copy" "corr" "correlation" "corresp" "countreg" "cpanel" "cpm" "cport" "cqlim" "cspatialreg" "cusum" "cv2view"
|
||||
"datasets" "datasource" "datekeys" "db2ext" "db2util" "dbcstab" "dbf" "dbload" "delete" "dfil" "dif" "discrim" "display" "distance" "dmsrvadm" "dmsrvdatasvc" "dmsrvprocesssvc" "document" "download" "dqloclst" "dqmatch" "dqscheme" "ds2" "dstods2" "dtree"
|
||||
"ecm" "entropy" "esm" "expand" "explode" "export"
|
||||
"factex" "factmac" "factor" "fastclus" "fastknn" "fcmp" "fedsql" "fism" "fmm" "fmtc2itm" "fontreg" "forest" "format" "forms" "freq" "freqtab" "fsbrowse" "fsedit" "fsletter" "fslist" "fsview"
|
||||
"g3d" "g3grid" "ga" "gam" "gammod" "gampl" "gamselect" "ganno" "gantt" "gareabar" "gbarline" "gchart" "gcontour" "gdevice" "gee" "genmod" "genselect" "geocode" "gfont" "ginside" "gis" "gkpi" "glimmix" "glm" "glmmod" "glmpower" "glmselect" "gmap" "gmm" "goptions" "gplot" "gproject" "gradar" "gradboost" "greduce" "gremove" "greplay" "groovy" "gslide" "gtile" "gvarclus"
|
||||
"hadoop" "hdmd" "hmm" "hp4score" "hpbin" "hpbnet" "hpboolrule" "hpcandisc" "hpcdm" "hpclus" "hpcopula" "hpcorr" "hpcountreg" "hpdecide" "hpdmdb" "hpds2" "hpexport" "hpf" "hpfarimaspec" "hpfdiagnose" "hpfengine" "hpfesmspec" "hpfevents" "hpfexmspec" "hpfidmspec" "hpfmm" "hpforest" "hpfreconcile" "hpfrepository" "hpfselect" "hpftemprecon" "hpfucmspec" "hpgenselect" "hpimpute" "hplmixed" "hplogistic" "hpmixed" "hpneural" "hpnlmod" "hppanel" "hppls" "hpprincomp" "hpqlim" "hpquantselect" "hpreduce" "hpreg" "hprisk" "hpsample" "hpseverity" "hpsplit" "hpsummary" "hpsvm" "hptmine" "hptmscore" "http"
|
||||
"ica" "iclifetest" "icphreg" "iml" "import" "imstat" "imxfer" "inbreed" "infomaps" "iomoperate" "irt" "ishikawa" "items"
|
||||
"javainfo" "json"
|
||||
"kclus" "kde" "kpca" "krige2d"
|
||||
"lasr" "lattice" "lifereg" "lifetest" "lmixed" "loan" "localedata" "loess" "logistic" "logselect" "lua"
|
||||
"macontrol" "mapimport" "mbanalysis" "mbc" "mcmc" "mdc" "mddb" "mds" "mdsummary" "means" "metadata" "metalib" "metaoperate" "mi" "mianalyze" "migrate" "mixed" "modeclus" "model" "modelmatrix" "mtlearn" "multtest" "mvpdiagnose" "mvpmodel" "mvpmonitor" "mwpca"
|
||||
"nested" "netdraw" "network" "nlin" "nlmixed" "nlmod" "nmf" "nnet" "npar1way"
|
||||
"odslist" "odstable" "odstext" "olap" "olapcontents" "olapoperate" "operate" "optex" "optgraph" "options" "optload" "optlp" "optlso" "optmilp" "optmodel" "optnet" "optnetwork" "optqp" "optsave" "orthoreg"
|
||||
"panel" "pareto" "partition" "pca" "pdlreg" "pds" "pdscopy" "phreg" "phselect" "plan" "plm" "plot" "pls" "plsmod" "pm" "pmenu" "power" "presenv" "princomp" "prinqual" "print" "printto" "probit" "proto" "prtdef" "prtexp" "psmatch" "pwencode"
|
||||
"qdevice" "qlim" "qtrselect" "quantlife" "quantreg" "quantselect" "quest"
|
||||
"rank" "rareevents" "rdc" "rdpool" "rdsec" "recommend" "reg" "registry" "regselect" "release" "reliability" "report" "risk" "rmstreg" "robustreg" "rpca" "rsreg"
|
||||
"s3" "sandwich" "scaproc" "score" "scoreaccel" "semisuplearn" "seqdesign" "seqtest" "server" "severity" "sevselect" "sgdesign" "sgmap" "sgpanel" "sgpie" "sgplot" "sgrender" "sgscatter" "shewhart" "sim2d" "similarity" "simlin" "simnormal" "simsystem" "smcalib" "smproject" "smscore" "smselect" "smspec" "soap" "sort" "source" "sparseml" "spatialreg" "spc" "spdo" "spectra" "spp" "sql" "sqoop" "ssm" "standard" "statespace" "stdize" "stdrate" "stepdisc" "stp" "stream" "summary" "surveyfreq" "surveyimpute" "surveylogistic" "surveymeans" "surveyphreg" "surveyreg" "surveyselect" "svdd" "svmachine" "syslin"
|
||||
"tabulate" "tapecopy" "tapelabel" "textmine" "timedata" "timeid" "timeplot" "timeseries" "tmodel" "tmscore" "tpspline" "transpose" "transreg" "trantab" "tree" "treesplit" "tscsreg" "tsinfo" "tsmodel" "tsne" "tsreconcile" "ttest"
|
||||
"ucm" "univariate" "upload"
|
||||
"varclus" "varcomp" "varimpute" "variogram" "varmax" "varreduce" "vasmp"
|
||||
"x11" "x12" "x13" "xsl"
|
||||
Reference in New Issue
Block a user