[Qgis-developer] ManageR error

Noli Sicad nsicad at gmail.com
Sun Sep 26 07:33:09 EDT 2010


Carson

Here's the log (below)

Noli

> lsf.str("package:base")
^ : function (e1, e2)
~ : .Primitive("~")
< : function (e1, e2)
<<- : .Primitive("<<-")
<= : function (e1, e2)
<- : .Primitive("<-")
= : .Primitive("=")
== : function (e1, e2)
> : function (e1, e2)
>= : function (e1, e2)
| : function (e1, e2)
|| : .Primitive("||")
- : function (e1, e2)
: : .Primitive(":")
:: : function (pkg, name)
::: : function (pkg, name)
! : function (x)
!= : function (e1, e2)
/ : function (e1, e2)
( : .Primitive("(")
[ : .Primitive("[")
[<- : .Primitive("[<-")
[[ : .Primitive("[[")
[[<- : .Primitive("[[<-")
{ : .Primitive("{")
@ : .Primitive("@")
$ : .Primitive("$")
$<- : .Primitive("$<-")
* : function (e1, e2)
& : function (e1, e2)
&& : .Primitive("&&")
%/% : function (e1, e2)
%*% : function (x, y)
%% : function (e1, e2)
+ : function (e1, e2)
abbreviate : function (names.arg, minlength = 4, use.classes = TRUE,
dot = FALSE,
    strict = FALSE, method = c("left.kept", "both.sides"))
abs : function (x)
acos : function (x)
acosh : function (x)
addNA : function (x, ifany = FALSE)
addTaskCallback : function (f, data = NULL, name = character(0L))
agrep : function (pattern, x, ignore.case = FALSE, value = FALSE,
max.distance = 0.1,
    useBytes = FALSE)
alist : function (...)
all : function (..., na.rm = FALSE)
all.equal : function (target, current, ...)
all.equal.character : function (target, current, check.attributes = TRUE, ...)
all.equal.default : function (target, current, ...)
all.equal.factor : function (target, current, check.attributes = TRUE, ...)
all.equal.formula : function (target, current, ...)
all.equal.language : function (target, current, ...)
all.equal.list : function (target, current, check.attributes = TRUE, ...)
all.equal.numeric : function (target, current, tolerance =
.Machine$double.eps^0.5,
    scale = NULL, check.attributes = TRUE, ...)
all.equal.POSIXct : function (target, current, ..., scale = 1)
all.equal.raw : function (target, current, check.attributes = TRUE, ...)
all.names : function (expr, functions = TRUE, max.names = -1L, unique = FALSE)
all.vars : function (expr, functions = FALSE, max.names = -1L, unique = TRUE)
any : function (..., na.rm = FALSE)
anyDuplicated : function (x, incomparables = FALSE, ...)
anyDuplicated.array : function (x, incomparables = FALSE, MARGIN = 1L,
fromLast = FALSE,
    ...)
anyDuplicated.data.frame : function (x, incomparables = FALSE,
fromLast = FALSE, ...)
anyDuplicated.default : function (x, incomparables = FALSE, fromLast =
FALSE, ...)
anyDuplicated.matrix : function (x, incomparables = FALSE, MARGIN =
1L, fromLast = FALSE,
    ...)
aperm : function (a, perm, resize = TRUE)
append : function (x, values, after = length(x))
apply : function (X, MARGIN, FUN, ...)
Arg : function (z)
args : function (name)
array : function (data = NA, dim = length(data), dimnames = NULL)
as.array : function (x, ...)
as.array.default : function (x, ...)
as.call : function (x)
as.character : function (x, ...)
as.character.condition : function (x, ...)
as.character.Date : function (x, ...)
as.character.default : function (x, ...)
as.character.error : function (x, ...)
as.character.factor : function (x, ...)
as.character.hexmode : function (x, upper.case = FALSE, ...)
as.character.numeric_version : function (x, ...)
as.character.octmode : function (x, ...)
as.character.POSIXt : function (x, ...)
as.character.srcref : function (x, useSource = TRUE, ...)
as.complex : function (x, ...)
as.data.frame : function (x, row.names = NULL, optional = FALSE, ...)
as.data.frame.array : function (x, row.names = NULL, optional = FALSE, ...)
as.data.frame.AsIs : function (x, row.names = NULL, optional = FALSE, ...)
as.data.frame.character : function (x, ..., stringsAsFactors =
default.stringsAsFactors())
as.data.frame.complex : function (x, row.names = NULL, optional =
FALSE, ..., nm = paste(deparse(substitute(x),
    width.cutoff = 500L), collapse = " "))
as.data.frame.data.frame : function (x, row.names = NULL, ...)
as.data.frame.Date : function (x, row.names = NULL, optional = FALSE,
..., nm = paste(deparse(substitute(x),
    width.cutoff = 500L), collapse = " "))
as.data.frame.default : function (x, ...)
as.data.frame.difftime : function (x, row.names = NULL, optional =
FALSE, ..., nm = paste(deparse(substitute(x),
    width.cutoff = 500L), collapse = " "))
as.data.frame.factor : function (x, row.names = NULL, optional =
FALSE, ..., nm = paste(deparse(substitute(x),
    width.cutoff = 500L), collapse = " "))
as.data.frame.integer : function (x, row.names = NULL, optional =
FALSE, ..., nm = paste(deparse(substitute(x),
    width.cutoff = 500L), collapse = " "))
as.data.frame.list : function (x, row.names = NULL, optional = FALSE,
..., stringsAsFactors = default.stringsAsFactors())
as.data.frame.logical : function (x, row.names = NULL, optional =
FALSE, ..., nm = paste(deparse(substitute(x),
    width.cutoff = 500L), collapse = " "))
as.data.frame.matrix : function (x, row.names = NULL, optional =
FALSE, ..., stringsAsFactors = default.stringsAsFactors())
as.data.frame.model.matrix : function (x, row.names = NULL, optional =
FALSE, ...)
as.data.frame.numeric : function (x, row.names = NULL, optional =
FALSE, ..., nm = paste(deparse(substitute(x),
    width.cutoff = 500L), collapse = " "))
as.data.frame.numeric_version : function (x, row.names = NULL,
optional = FALSE, ..., nm = paste(deparse(substitute(x),
    width.cutoff = 500L), collapse = " "))
as.data.frame.ordered : function (x, row.names = NULL, optional =
FALSE, ..., nm = paste(deparse(substitute(x),
    width.cutoff = 500L), collapse = " "))
as.data.frame.POSIXct : function (x, row.names = NULL, optional =
FALSE, ..., nm = paste(deparse(substitute(x),
    width.cutoff = 500L), collapse = " "))
as.data.frame.POSIXlt : function (x, row.names = NULL, optional = FALSE, ...)
as.data.frame.raw : function (x, row.names = NULL, optional = FALSE,
..., nm = paste(deparse(substitute(x),
    width.cutoff = 500L), collapse = " "))
as.data.frame.table : function (x, row.names = NULL, ..., responseName
= "Freq", stringsAsFactors = TRUE)
as.data.frame.ts : function (x, ...)
as.data.frame.vector : function (x, row.names = NULL, optional =
FALSE, ..., nm = paste(deparse(substitute(x),
    width.cutoff = 500L), collapse = " "))
as.Date : function (x, ...)
as.Date.character : function (x, format = "", ...)
as.Date.date : function (x, ...)
as.Date.dates : function (x, ...)
as.Date.default : function (x, ...)
as.Date.factor : function (x, ...)
as.Date.numeric : function (x, origin, ...)
as.Date.POSIXct : function (x, ...)
as.Date.POSIXlt : function (x, ...)
as.difftime : function (tim, format = "%X", units = "auto")
as.double : function (x, ...)
as.double.difftime : function (x, units = "auto", ...)
as.double.POSIXlt : function (x, ...)
as.environment : function (object)
as.expression : function (x, ...)
as.expression.default : function (x, ...)
as.factor : function (x)
as.function : function (x, ...)
as.function.default : function (x, envir = parent.frame(), ...)
as.hexmode : function (x)
asin : function (x)
asinh : function (x)
as.integer : function (x, ...)
[.AsIs : function (x, i, ...)
as.list : function (x, ...)
as.list.data.frame : function (x, ...)
as.list.default : function (x, ...)
as.list.environment : function (x, all.names = FALSE, ...)
as.list.factor : function (x, ...)
as.list.function : function (x, ...)
as.list.numeric_version : function (x, ...)
as.logical : function (x, ...)
as.matrix : function (x, ...)
as.matrix.data.frame : function (x, rownames.force = NA, ...)
as.matrix.default : function (x, ...)
as.matrix.noquote : function (x, ...)
as.matrix.POSIXlt : function (x, ...)
as.name : function (x)
asNamespace : function (ns, base.OK = TRUE)
as.null : function (x, ...)
as.null.default : function (x, ...)
as.numeric : function (x, ...)
as.numeric_version : function (x)
as.octmode : function (x)
as.ordered : function (x)
as.package_version : function (x)
as.pairlist : function (x)
as.POSIXct : function (x, tz = "", ...)
as.POSIXct.date : function (x, ...)
as.POSIXct.Date : function (x, ...)
as.POSIXct.dates : function (x, ...)
as.POSIXct.default : function (x, tz = "", ...)
as.POSIXct.numeric : function (x, tz = "", origin, ...)
as.POSIXct.POSIXlt : function (x, tz = "", ...)
as.POSIXlt : function (x, tz = "", ...)
as.POSIXlt.character : function (x, tz = "", format, ...)
as.POSIXlt.date : function (x, ...)
as.POSIXlt.Date : function (x, ...)
as.POSIXlt.dates : function (x, ...)
as.POSIXlt.default : function (x, tz = "", ...)
as.POSIXlt.factor : function (x, ...)
as.POSIXlt.numeric : function (x, tz = "", origin, ...)
as.POSIXlt.POSIXct : function (x, tz = "", ...)
as.qr : function (x)
as.raw : function (x)
as.real : function (x, ...)
asS4 : function (object, flag = TRUE, complete = TRUE)
assign : function (x, value, pos = -1, envir = as.environment(pos),
inherits = FALSE,
    immediate = TRUE)
as.single : function (x, ...)
as.single.default : function (x, ...)
as.symbol : function (x)
as.table : function (x, ...)
as.table.default : function (x, ...)
as.vector : function (x, mode = "any")
as.vector.factor : function (x, mode = "any")
atan : function (x)
atan2 : function (y, x)
atanh : function (x)
attach : function (what, pos = 2, name = deparse(substitute(what)),
warn.conflicts = TRUE)
attachNamespace : function (ns, pos = 2, dataPath = NULL)
attr : function (x, which, exact = FALSE)
attr<- : function (x, which, value)
attr.all.equal : function (target, current, check.attributes = TRUE,
check.names = TRUE,
    ...)
attributes : function (obj)
attributes<- : function (obj, value)
autoload : function (name, package, reset = FALSE, ...)
autoloader : function (name, package, ...)
backsolve : function (r, x, k = ncol(r), upper.tri = TRUE, transpose = FALSE)
baseenv : function ()
basename : function (path)
besselI : function (x, nu, expon.scaled = FALSE)
besselJ : function (x, nu)
besselK : function (x, nu, expon.scaled = FALSE)
besselY : function (x, nu)
beta : function (a, b)
bindingIsActive : function (sym, env)
bindingIsLocked : function (sym, env)
bindtextdomain : function (domain, dirname = NULL)
body : function (fun = sys.function(sys.parent()))
body<- : function (fun, envir = environment(fun), value)
bquote : function (expr, where = parent.frame())
break : .Primitive("break")
browser : function (text = "", condition = NULL, expr = TRUE)
browserCondition : function (n = 1L)
browserSetDebug : function (n = 1L)
browserText : function (n = 1L)
builtins : function (internal = FALSE)
by : function (data, INDICES, FUN, ..., simplify = TRUE)
by.data.frame : function (data, INDICES, FUN, ..., simplify = TRUE)
by.default : function (data, INDICES, FUN, ..., simplify = TRUE)
bzfile : function (description, open = "", encoding = getOption("encoding"),
    compression = 9)
c : function (..., recursive = FALSE)
call : function (name, ...)
callCC : function (fun)
capabilities : function (what = NULL)
casefold : function (x, upper = FALSE)
cat : function (..., file = "", sep = " ", fill = FALSE, labels = NULL,
    append = FALSE)
category : function (...)
cbind : function (..., deparse.level = 1)
cbind.data.frame : function (..., deparse.level = 1)
c.Date : function (..., recursive = FALSE)
ceiling : function (x)
character : function (length = 0)
char.expand : function (input, target, nomatch = stop("no match"))
charmatch : function (x, table, nomatch = NA_integer_)
charToRaw : function (x)
chartr : function (old, new, x)
check_tzones : function (...)
chol : function (x, ...)
chol2inv : function (x, size = NCOL(x), LINPACK = FALSE)
chol.default : function (x, pivot = FALSE, LINPACK = pivot, ...)
choose : function (n, k)
class : function (x)
class<- : function (x, value)
close : function (con, ...)
closeAllConnections : function ()
close.connection : function (con, type = "rw", ...)
close.srcfile : function (con, ...)
c.noquote : function (..., recursive = FALSE)
c.numeric_version : function (..., recursive = FALSE)
codes : function (x, ...)
codes<- : function (x, ..., value)
codes.factor : function (x, ...)
codes.ordered : function (x, ...)
col : function (x, as.factor = FALSE)
colMeans : function (x, na.rm = FALSE, dims = 1L)
colnames : function (x, do.NULL = TRUE, prefix = "col")
colnames<- : function (x, value)
colSums : function (x, na.rm = FALSE, dims = 1L)
commandArgs : function (trailingOnly = FALSE)
comment : function (x)
comment<- : function (x, value)
complex : function (length.out = 0, real = numeric(), imaginary = numeric(),
    modulus = 1, argument = 0)
computeRestarts : function (cond = NULL)
conditionCall : function (c)
conditionCall.condition : function (c)
conditionMessage : function (c)
conditionMessage.condition : function (c)
conflicts : function (where = search(), detail = FALSE)
Conj : function (z)
contributors : function ()
cos : function (x)
cosh : function (x)
c.POSIXct : function (..., recursive = FALSE)
c.POSIXlt : function (..., recursive = FALSE)
crossprod : function (x, y = NULL)
Cstack_info : function ()
cummax : function (x)
cummin : function (x)
cumprod : function (x)
cumsum : function (x)
cut : function (x, ...)
cut.Date : function (x, breaks, labels = NULL, start.on.monday = TRUE,
right = FALSE,
    ...)
cut.default : function (x, breaks, labels = NULL, include.lowest =
FALSE, right = TRUE,
    dig.lab = 3, ordered_result = FALSE, ...)
cut.POSIXt : function (x, breaks, labels = NULL, start.on.monday =
TRUE, right = FALSE,
    ...)
data.class : function (x)
[<-.data.frame : function (x, i, j, value)
[.data.frame : function (x, i, j, drop = if (missing(i)) TRUE else
length(cols) ==
    1)
[[<-.data.frame : function (x, i, j, value)
[[.data.frame : function (x, ..., exact = TRUE)
$<-.data.frame : function (x, name, value)
data.frame : function (..., row.names = NULL, check.rows = FALSE,
check.names = TRUE,
    stringsAsFactors = default.stringsAsFactors())
data.matrix : function (frame, rownames.force = NA)
date : function ()
-.Date : function (e1, e2)
[<-.Date : function (x, ..., value)
[.Date : function (x, ..., drop = TRUE)
[[.Date : function (x, ..., drop = TRUE)
+.Date : function (e1, e2)
debug : function (fun, text = "", condition = NULL)
debugonce : function (fun, text = "", condition = NULL)
default.stringsAsFactors : function ()
delay : function (x, env = .GlobalEnv)
delayedAssign : function (x, value, eval.env = parent.frame(1),
assign.env = parent.frame(1))
deparse : function (expr, width.cutoff = 60L, backtick = mode(expr) %in%
    c("call", "expression", "(", "function"), control = c("keepInteger",
    "showAttributes", "keepNA"), nlines = -1L)
det : function (x, ...)
detach : function (name, pos = 2, unload = FALSE, character.only = FALSE)
determinant : function (x, logarithm = TRUE, ...)
determinant.matrix : function (x, logarithm = TRUE, ...)
dget : function (file)
diag : function (x = 1, nrow, ncol)
diag<- : function (x, value)
diff : function (x, ...)
diff.Date : function (x, lag = 1L, differences = 1L, ...)
diff.default : function (x, lag = 1L, differences = 1L, ...)
diff.POSIXt : function (x, lag = 1L, differences = 1L, ...)
difftime : function (time1, time2, tz = "", units = c("auto", "secs", "mins",
    "hours", "days", "weeks"))
/.difftime : function (e1, e2)
[.difftime : function (x, ..., drop = TRUE)
*.difftime : function (e1, e2)
digamma : function (x)
dim : function (x)
dim<- : function (x, value)
dim.data.frame : function (x)
dimnames : function (x)
dimnames<- : function (x, value)
dimnames<-.data.frame : function (x, value)
dimnames.data.frame : function (x)
dir : function (path = ".", pattern = NULL, all.files = FALSE,
full.names = FALSE,
    recursive = FALSE, ignore.case = FALSE)
dir.create : function (path, showWarnings = TRUE, recursive = FALSE,
mode = "0777")
dirname : function (path)
$.DLLInfo : function (x, name)
do.call : function (what, args, quote = FALSE, envir = parent.frame())
double : function (length = 0)
dput : function (x, file = "", control = c("keepNA", "keepInteger",
    "showAttributes"))
dQuote : function (x)
drop : function (x)
dump : function (list, file = "dumpdata.R", append = FALSE, control = "all",
    envir = parent.frame(), evaluate = TRUE)
duplicated : function (x, incomparables = FALSE, ...)
duplicated.array : function (x, incomparables = FALSE, MARGIN = 1L,
fromLast = FALSE,
    ...)
duplicated.data.frame : function (x, incomparables = FALSE, fromLast =
FALSE, ...)
duplicated.default : function (x, incomparables = FALSE, fromLast =
FALSE, ...)
duplicated.matrix : function (x, incomparables = FALSE, MARGIN = 1L,
fromLast = FALSE,
    ...)
duplicated.numeric_version : function (x, incomparables = FALSE, ...)
duplicated.POSIXlt : function (x, incomparables = FALSE, ...)
dyn.load : function (x, local = TRUE, now = TRUE, ...)
dyn.unload : function (x)
eapply : function (env, FUN, ..., all.names = FALSE, USE.NAMES = TRUE)
eigen : function (x, symmetric, only.values = FALSE, EISPACK = FALSE)
emptyenv : function ()
encodeString : function (x, width = 0, quote = "", na.encode = TRUE,
justify = c("left",
    "right", "centre", "none"))
Encoding : function (x)
Encoding<- : function (x, value)
environment : function (fun = NULL)
environment<- : function (fun, value)
environmentIsLocked : function (env)
environmentName : function (env)
env.profile : function (env)
eval : function (expr, envir = parent.frame(), enclos = if (is.list(envir) ||
    is.pairlist(envir)) parent.frame() else baseenv())
eval.parent : function (expr, n = 1)
evalq : function (expr, envir = parent.frame(), enclos = if (is.list(envir) ||
    is.pairlist(envir)) parent.frame() else baseenv())
exists : function (x, where = -1, envir = if (missing(frame))
as.environment(where) else sys.frame(frame),
    frame, mode = "any", inherits = TRUE)
exp : function (x)
expand.grid : function (..., KEEP.OUT.ATTRS = TRUE, stringsAsFactors = TRUE)
expm1 : function (x)
expression : function (...)
factor : function (x = character(), levels, labels = levels, exclude = NA,
    ordered = is.ordered(x))
[<-.factor : function (x, ..., value)
[.factor : function (x, ..., drop = FALSE)
[[.factor : function (x, ...)
factorial : function (x)
fifo : function (description, open = "", blocking = FALSE, encoding =
getOption("encoding"))
file : function (description = "", open = "", blocking = TRUE,
encoding = getOption("encoding"))
file.access : function (names, mode = 0)
file.append : function (file1, file2)
file.choose : function (new = FALSE)
file.copy : function (from, to, overwrite = recursive, recursive = FALSE)
file.create : function (..., showWarnings = TRUE)
file.exists : function (...)
file.info : function (...)
file.path : function (..., fsep = .Platform$file.sep)
file.remove : function (...)
file.rename : function (from, to)
file.show : function (..., header = rep("", nfiles), title = "R Information",
    delete.file = FALSE, pager = getOption("pager"), encoding = "")
file.symlink : function (from, to)
Filter : function (f, x)
Find : function (f, x, right = FALSE, nomatch = NULL)
findInterval : function (x, vec, rightmost.closed = FALSE, all.inside = FALSE)
findPackageEnv : function (info)
findRestart : function (name, cond = NULL)
floor : function (x)
flush : function (con)
flush.connection : function (con)
for : .Primitive("for")
force : function (x)
formals : function (fun = sys.function(sys.parent()))
formals<- : function (fun, envir = environment(fun), value)
format : function (x, ...)
format.AsIs : function (x, width = 12, ...)
formatC : function (x, digits = NULL, width = NULL, format = NULL, flag = "",
    mode = NULL, big.mark = "", big.interval = 3L, small.mark = "",
    small.interval = 5L, decimal.mark = ".", preserve.width = "individual",
    zero.print = NULL, drop0trailing = FALSE)
format.char : function (x, width = NULL, flag = "-")
format.data.frame : function (x, ..., justify = "none")
format.Date : function (x, ...)
format.default : function (x, trim = FALSE, digits = NULL, nsmall =
0L, justify = c("left",
    "right", "centre", "none"), width = NULL, na.encode = TRUE,
    scientific = NA, big.mark = "", big.interval = 3L, small.mark = "",
    small.interval = 5L, decimal.mark = ".", zero.print = NULL,
    drop0trailing = FALSE, ...)
format.difftime : function (x, ...)
formatDL : function (x, y, style = c("table", "list"), width = 0.9 *
getOption("width"),
    indent = NULL)
format.factor : function (x, ...)
format.hexmode : function (x, upper.case = FALSE, ...)
format.info : function (x, digits = NULL, nsmall = 0)
format.octmode : function (x, ...)
format.POSIXct : function (x, format = "", tz = "", usetz = FALSE, ...)
format.POSIXlt : function (x, format = "", usetz = FALSE, ...)
format.pval : function (pv, digits = max(1, getOption("digits") - 2),
eps = .Machine$double.eps,
    na.form = "NA")
forwardsolve : function (l, x, k = ncol(l), upper.tri = FALSE,
transpose = FALSE)
function : .Primitive("function")
gamma : function (x)
gammaCody : function (x)
gc : function (verbose = getOption("verbose"), reset = FALSE)
gcinfo : function (verbose)
gc.time : function (on = TRUE)
gctorture : function (on = TRUE)
get : function (x, pos = -1, envir = as.environment(pos), mode = "any",
    inherits = TRUE)
getAllConnections : function ()
getCallingDLL : function (f = sys.function(-1), doStop = FALSE)
getCallingDLLe : function (e)
getCConverterDescriptions : function ()
getCConverterStatus : function ()
getConnection : function (what)
getDLLRegisteredRoutines : function (dll, addNames = TRUE)
getDLLRegisteredRoutines.character : function (dll, addNames = TRUE)
getDLLRegisteredRoutines.DLLInfo : function (dll, addNames = TRUE)
getenv : function (...)
geterrmessage : function ()
getExportedValue : function (ns, name)
getHook : function (hookName)
getLoadedDLLs : function ()
getNamespace : function (name)
getNamespaceExports : function (ns)
getNamespaceImports : function (ns)
getNamespaceInfo : function (ns, which)
getNamespaceName : function (ns)
getNamespaceUsers : function (ns)
getNamespaceVersion : function (ns)
getNativeSymbolInfo : function (name, PACKAGE, unlist = TRUE,
withRegistrationInfo = FALSE)
getNumCConverters : function ()
getOption : function (x, default = NULL)
getRversion : function ()
getSrcLines : function (srcfile, first, last)
getTaskCallbackNames : function ()
gettext : function (..., domain = NULL)
gettextf : function (fmt, ..., domain = NULL)
getwd : function ()
gl : function (n, k, length = n * k, labels = 1:n, ordered = FALSE)
globalenv : function ()
gregexpr : function (pattern, text, ignore.case = FALSE, extended = TRUE,
    perl = FALSE, fixed = FALSE, useBytes = FALSE)
grep : function (pattern, x, ignore.case = FALSE, extended = TRUE,
perl = FALSE,
    value = FALSE, fixed = FALSE, useBytes = FALSE, invert = FALSE)
grepl : function (pattern, x, ignore.case = FALSE, extended = TRUE,
perl = FALSE,
    fixed = FALSE, useBytes = FALSE)
gsub : function (pattern, replacement, x, ignore.case = FALSE, extended = TRUE,
    perl = FALSE, fixed = FALSE, useBytes = FALSE)
gzcon : function (con, level = 6, allowNonCompressed = TRUE)
gzfile : function (description, open = "", encoding = getOption("encoding"),
    compression = 6)
[.hexmode : function (x, i)
httpclient : function (url, port = 80, error.is.fatal = TRUE,
check.MIME.type = TRUE,
    file = tempfile(), drop.ctrl.z = TRUE)
I : function (x)
iconv : function (x, from = "", to = "", sub = NA, mark = TRUE)
iconvlist : function ()
icuSetCollate : function (...)
identical : function (x, y, num.eq = TRUE, single.NA = TRUE,
attrib.as.set = TRUE)
identity : function (x)
if : .Primitive("if")
ifelse : function (test, yes, no)
Im : function (z)
importIntoEnv : function (impenv, impnames, expenv, expnames)
%in% : function (x, table)
inherits : function (x, what, which = FALSE)
integer : function (length = 0)
interaction : function (..., drop = FALSE, sep = ".", lex.order = FALSE)
interactive : function ()
intersect : function (x, y)
intToBits : function (x)
intToUtf8 : function (x, multiple = FALSE)
inverse.rle : function (x, ...)
invisible : function (x)
invokeRestart : function (r, ...)
invokeRestartInteractively : function (r)
is.array : function (x)
is.atomic : function (x)
isBaseNamespace : function (ns)
is.call : function (x)
is.character : function (x)
is.complex : function (x)
is.data.frame : function (x)
isdebugged : function (fun)
is.double : function (x)
is.element : function (el, set)
is.environment : function (x)
is.expression : function (x)
is.factor : function (x)
is.finite : function (x)
is.function : function (x)
isIncomplete : function (con)
is.infinite : function (x)
is.integer : function (x)
is.language : function (x)
is.list : function (x)
is.loaded : function (symbol, PACKAGE = "", type = "")
is.logical : function (x)
is.matrix : function (x)
is.na : function (x)
is.na<- : function (x, value)
is.na.data.frame : function (x)
is.na<-.default : function (x, value)
is.na<-.factor : function (x, value)
is.name : function (x)
isNamespace : function (ns)
is.nan : function (x)
is.na.numeric_version : function (x)
is.na.POSIXlt : function (x)
is.null : function (x)
is.numeric : function (x)
is.numeric.Date : function (x)
is.numeric.POSIXt : function (x)
is.numeric_version : function (x)
is.object : function (x)
ISOdate : function (year, month, day, hour = 12, min = 0, sec = 0, tz = "GMT")
ISOdatetime : function (year, month, day, hour, min, sec, tz = "")
isOpen : function (con, rw = "")
is.ordered : function (x)
is.package_version : function (x)
is.pairlist : function (x)
is.primitive : function (x)
is.qr : function (x)
is.R : function ()
is.raw : function (x)
is.real : function (x)
is.recursive : function (x)
isRestart : function (x)
isS4 : function (object)
isSeekable : function (con)
is.single : function (x)
is.symbol : function (x)
isSymmetric : function (object, ...)
isSymmetric.matrix : function (object, tol = 100 * .Machine$double.eps, ...)
is.table : function (x)
isTRUE : function (x)
is.unsorted : function (x, na.rm = FALSE, strictly = FALSE)
is.vector : function (x, mode = "any")
jitter : function (x, factor = 1, amount = NULL)
julian : function (x, ...)
julian.Date : function (x, origin = as.Date("1970-01-01"), ...)
julian.POSIXt : function (x, origin = as.POSIXct("1970-01-01", tz =
"GMT"), ...)
kappa : function (z, ...)
kappa.default : function (z, exact = FALSE, norm = NULL, method =
c("qr", "direct"),
    ...)
kappa.lm : function (z, ...)
kappa.qr : function (z, ...)
kappa.tri : function (z, exact = FALSE, LINPACK = TRUE, norm = NULL, ...)
kronecker : function (X, Y, FUN = "*", make.dimnames = FALSE, ...)
l10n_info : function ()
labels : function (object, ...)
labels.default : function (object, ...)
La.chol : function (x)
La.chol2inv : function (x, size = ncol(x))
La.eigen : function (x, symmetric, only.values = FALSE, method = c("dsyevr",
    "dsyev"))
lapply : function (X, FUN, ...)
La.svd : function (x, nu = min(n, p), nv = min(n, p))
lazyLoad : function (filebase, envir = parent.frame(), filter)
lazyLoadDBfetch : function (key, file, compressed, hook)
lbeta : function (a, b)
lchoose : function (n, k)
length : function (x)
length<- : function (x, value)
length<-.factor : function (x, value)
levels : function (x)
levels<- : function (x, value)
levels.default : function (x)
levels<-.factor : function (x, value)
lfactorial : function (x)
lgamma : function (x)
library : function (package, help, pos = 2, lib.loc = NULL,
character.only = FALSE,
    logical.return = FALSE, warn.conflicts = TRUE, keep.source =
getOption("keep.source.pkgs"),
    verbose = getOption("verbose"))
library.dynam : function (chname, package = NULL, lib.loc = NULL,
verbose = getOption("verbose"),
    file.ext = .Platform$dynlib.ext, ...)
library.dynam.unload : function (chname, libpath, verbose =
getOption("verbose"), file.ext = .Platform$dynlib.ext)
licence : function ()
license : function ()
list : function (...)
list.files : function (path = ".", pattern = NULL, all.files = FALSE,
full.names = FALSE,
    recursive = FALSE, ignore.case = FALSE)
[.listof : function (x, i, ...)
load : function (file, envir = parent.frame())
loadedNamespaces : function ()
loadingNamespaceInfo : function ()
loadNamespace : function (package, lib.loc = NULL, keep.source =
getOption("keep.source.pkgs"),
    partial = FALSE, declarativeOnly = FALSE)
loadURL : function (url, envir = parent.frame(), quiet = TRUE, ...)
local : function (expr, envir = new.env())
lockBinding : function (sym, env)
lockEnvironment : function (env, bindings = FALSE)
log : function (x, base = exp(1))
log10 : function (x)
log1p : function (x)
log2 : function (x)
logb : function (x, base = exp(1))
logical : function (length = 0)
lower.tri : function (x, diag = FALSE)
ls : function (name, pos = -1, envir = as.environment(pos), all.names = FALSE,
    pattern)
machine : function ()
Machine : function ()
makeActiveBinding : function (sym, fun, env)
make.names : function (names, unique = FALSE, allow_ = TRUE)
make.unique : function (names, sep = ".")
manglePackageName : function (pkgName, pkgVersion)
Map : function (f, ...)
mapply : function (FUN, ..., MoreArgs = NULL, SIMPLIFY = TRUE,
USE.NAMES = TRUE)
margin.table : function (x, margin = NULL)
match : function (x, table, nomatch = NA_integer_, incomparables = NULL)
match.arg : function (arg, choices, several.ok = FALSE)
match.call : function (definition = NULL, call =
sys.call(sys.parent()), expand.dots = TRUE)
match.fun : function (FUN, descend = TRUE)
Math.data.frame : function (x, ...)
Math.Date : function (x, ...)
Math.difftime : function (x, ...)
Math.factor : function (x, ...)
Math.POSIXt : function (x, ...)
mat.or.vec : function (nr, nc)
matrix : function (data = NA, nrow = 1, ncol = 1, byrow = FALSE,
dimnames = NULL)
max : function (..., na.rm = FALSE)
max.col : function (m, ties.method = c("random", "first", "last"))
mean : function (x, ...)
mean.data.frame : function (x, ...)
mean.Date : function (x, ...)
mean.default : function (x, trim = 0, na.rm = FALSE, ...)
mean.difftime : function (x, ...)
mean.POSIXct : function (x, ...)
mean.POSIXlt : function (x, ...)
memCompress : function (from, type = c("gzip", "bzip2", "xz", "none"))
memDecompress : function (from, type = c("unknown", "gzip", "bzip2",
"xz", "none"),
    asChar = FALSE)
mem.limits : function (nsize = NA, vsize = NA)
memory.profile : function ()
merge : function (x, y, ...)
merge.data.frame : function (x, y, by = intersect(names(x), names(y)),
by.x = by,
    by.y = by, all = FALSE, all.x = all, all.y = all, sort = TRUE,
    suffixes = c(".x", ".y"), incomparables = NULL, ...)
merge.default : function (x, y, ...)
message : function (..., domain = NULL, appendLF = TRUE)
mget : function (x, envir, mode = "any", ifnotfound = list(function(x)
stop(paste("value for '",
    x, "' not found", sep = ""), call. = FALSE)), inherits = FALSE)
min : function (..., na.rm = FALSE)
missing : function (x)
Mod : function (z)
mode : function (x)
mode<- : function (x, value)
months : function (x, abbreviate)
months.Date : function (x, abbreviate = FALSE)
months.POSIXt : function (x, abbreviate = FALSE)
mostattributes<- : function (obj, value)
names : function (x)
names<- : function (x, value)
namespaceExport : function (ns, vars)
namespaceImport : function (self, ...)
namespaceImportClasses : function (self, ns, vars)
namespaceImportFrom : function (self, ns, vars, generics, packages)
namespaceImportMethods : function (self, ns, vars)
nargs : function ()
nchar : function (x, type = "chars", allowNA = FALSE)
ncol : function (x)
NCOL : function (x)
Negate : function (f)
new.env : function (hash = FALSE, parent = parent.frame(), size = 29L)
next : .Primitive("next")
NextMethod : function (generic = NULL, object = NULL, ...)
ngettext : function (n, msg1, msg2, domain = NULL)
nlevels : function (x)
noquote : function (obj)
[.noquote : function (x, ...)
nrow : function (x)
NROW : function (x)
numeric : function (length = 0)
[.numeric_version : function (x, i, j)
[[<-.numeric_version : function (x, ..., value)
[[.numeric_version : function (x, ..., exact = NA)
numeric_version : function (x, strict = TRUE)
nzchar : function (x)
%o% : function (X, Y)
objects : function (name, pos = -1, envir = as.environment(pos),
all.names = FALSE,
    pattern)
[.octmode : function (x, i)
oldClass : function (x)
oldClass<- : function (x, value)
on.exit : function (expr, add = FALSE)
open : function (con, ...)
open.connection : function (con, open = "r", blocking = TRUE, ...)
open.srcfile : function (con, line, ...)
open.srcfilecopy : function (con, line, ...)
Ops.data.frame : function (e1, e2 = NULL)
Ops.Date : function (e1, e2)
Ops.difftime : function (e1, e2)
Ops.factor : function (e1, e2)
Ops.numeric_version : function (e1, e2)
Ops.ordered : function (e1, e2)
Ops.POSIXt : function (e1, e2)
options : function (...)
order : function (..., na.last = TRUE, decreasing = FALSE)
ordered : function (x, ...)
outer : function (X, Y, FUN = "*", ...)
package.description : function (pkg, lib.loc = NULL, fields = NULL)
packageEvent : function (pkgname, event = c("onLoad", "attach",
"detach", "onUnload"))
packageHasNamespace : function (package, package.lib)
packageStartupMessage : function (..., domain = NULL, appendLF = TRUE)
$.package_version : function (x, name)
package_version : function (x, strict = TRUE)
packBits : function (x, type = c("raw", "integer"))
pairlist : function (...)
parent.env : function (env)
parent.env<- : function (env, value)
parent.frame : function (n = 1)
parse : function (file = "", n = NULL, text = NULL, prompt = "?",
srcfile = NULL,
    encoding = "unknown")
parse.dcf : function (text = NULL, file = "", fields = NULL,
versionfix = FALSE)
parseNamespaceFile : function (package, package.lib, mustExist = TRUE)
paste : function (..., sep = " ", collapse = NULL)
path.expand : function (path)
pentagamma : function (x)
pipe : function (description, open = "", encoding = getOption("encoding"))
Platform : function ()
pmatch : function (x, table, nomatch = NA_integer_, duplicates.ok = FALSE)
pmax : function (..., na.rm = FALSE)
pmax.int : function (..., na.rm = FALSE)
pmin : function (..., na.rm = FALSE)
pmin.int : function (..., na.rm = FALSE)
polyroot : function (z)
Position : function (f, x, right = FALSE, nomatch = NA_integer_)
[<-.POSIXct : function (x, ..., value)
[.POSIXct : function (x, ..., drop = TRUE)
[[.POSIXct : function (x, ..., drop = TRUE)
[<-.POSIXlt : function (x, i, value)
[.POSIXlt : function (x, ..., drop = TRUE)
-.POSIXt : function (e1, e2)
+.POSIXt : function (e1, e2)
pos.to.env : function (x)
pretty : function (x, n = 5, min.n = n%/%3, shrink.sml = 0.75,
high.u.bias = 1.5,
    u5.bias = 0.5 + 1.5 * high.u.bias, eps.correct = 0)
prettyNum : function (x, big.mark = "", big.interval = 3L, small.mark = "",
    small.interval = 5L, decimal.mark = ".", preserve.width = c("common",
        "individual", "none"), zero.print = NULL, drop0trailing = FALSE,
    is.cmplx = NA, ...)
print : function (x, ...)
print.AsIs : function (x, ...)
print.by : function (x, ..., vsep)
print.condition : function (x, ...)
print.connection : function (x, ...)
print.data.frame : function (x, ..., digits = NULL, quote = FALSE,
right = TRUE,
    row.names = TRUE)
print.Date : function (x, ...)
print.default : function (x, digits = NULL, quote = TRUE, na.print =
NULL, print.gap = NULL,
    right = FALSE, max = NULL, useSource = TRUE, ...)
print.difftime : function (x, digits = getOption("digits"), ...)
print.DLLInfo : function (x, ...)
print.DLLInfoList : function (x, ...)
print.DLLRegisteredRoutines : function (x, ...)
print.factor : function (x, quote = FALSE, max.levels = NULL, width =
getOption("width"),
    ...)
print.function : function (x, useSource = TRUE, ...)
print.hexmode : function (x, ...)
print.libraryIQR : function (x, ...)
print.listof : function (x, ...)
print.NativeRoutineList : function (x, ...)
printNoClass : function (x, digits = NULL, quote = TRUE, na.print =
NULL, print.gap = NULL,
    right = FALSE, ...)
print.noquote : function (x, ...)
print.numeric_version : function (x, ...)
print.octmode : function (x, ...)
print.packageInfo : function (x, ...)
print.POSIXct : function (x, ...)
print.POSIXlt : function (x, ...)
print.proc_time : function (x, ...)
print.restart : function (x, ...)
print.rle : function (x, digits = getOption("digits"), ...)
print.simple.list : function (x, ...)
print.srcfile : function (x, ...)
print.srcref : function (x, useSource = TRUE, ...)
print.summary.table : function (x, digits = max(1, getOption("digits")
- 3), ...)
print.table : function (x, digits = getOption("digits"), quote =
FALSE, na.print = "",
    zero.print = "0", justify = "none", ...)
print.warnings : function (x, ...)
prmatrix : function (x, rowlab = dn[[1]], collab = dn[[2]], quote = TRUE,
    right = FALSE, na.print = NULL, ...)
proc.time : function ()
prod : function (..., na.rm = FALSE)
prop.table : function (x, margin = NULL)
provide : function (package)
psigamma : function (x, deriv = 0)
pushBack : function (data, connection, newLine = TRUE)
pushBackLength : function (connection)
q : function (save = "default", status = 0, runLast = TRUE)
qr : function (x, ...)
qr.coef : function (qr, y)
qr.default : function (x, tol = 1e-07, LAPACK = FALSE, ...)
qr.fitted : function (qr, y, k = qr$rank)
qr.Q : function (qr, complete = FALSE, Dvec = rep.int(if (cmplx) 1 +
    (0+0i) else 1, if (complete) dqr[1] else min(dqr)))
qr.qty : function (qr, y)
qr.qy : function (qr, y)
qr.R : function (qr, complete = FALSE)
qr.resid : function (qr, y)
qr.solve : function (a, b, tol = 1e-07)
qr.X : function (qr, complete = FALSE, ncol = if (complete) nrow(R)
else min(dim(R)))
quarters : function (x, abbreviate)
quarters.Date : function (x, ...)
quarters.POSIXt : function (x, ...)
quit : function (save = "default", status = 0, runLast = TRUE)
quote : function (expr)
range : function (..., na.rm = FALSE)
range.default : function (..., na.rm = FALSE, finite = FALSE)
rank : function (x, na.last = TRUE, ties.method = c("average", "first",
    "random", "max", "min"))
rapply : function (object, f, classes = "ANY", deflt = NULL, how = c("unlist",
    "replace", "list"), ...)
raw : function (length = 0)
rawConnection : function (object, open = "r")
rawConnectionValue : function (con)
rawShift : function (x, n)
rawToBits : function (x)
rawToChar : function (x, multiple = FALSE)
rbind : function (..., deparse.level = 1)
rbind.data.frame : function (..., deparse.level = 1)
rcond : function (x, norm = c("O", "I", "1"), triangular = FALSE, ...)
Re : function (z)
readBin : function (con, what, n = 1L, size = NA_integer_, signed = TRUE,
    endian = .Platform$endian)
readChar : function (con, nchars, useBytes = FALSE)
read.dcf : function (file, fields = NULL, all = FALSE)
readline : function (prompt = "")
readLines : function (con = stdin(), n = -1L, ok = TRUE, warn = TRUE,
encoding = "unknown")
read.table.url : function (url, method, ...)
real : function (length = 0)
Recall : function (...)
Reduce : function (f, x, init, right = FALSE, accumulate = FALSE)
regexpr : function (pattern, text, ignore.case = FALSE, extended = TRUE,
    perl = FALSE, fixed = FALSE, useBytes = FALSE)
reg.finalizer : function (e, f, onexit = FALSE)
registerS3method : function (genname, class, method, envir = parent.frame())
registerS3methods : function (info, package, env)
remove : function (..., list = character(0L), pos = -1, envir =
as.environment(pos),
    inherits = FALSE)
removeCConverter : function (id)
removeTaskCallback : function (id)
rep : function (x, ...)
rep.Date : function (x, ...)
repeat : .Primitive("repeat")
rep.factor : function (x, ...)
rep.int : function (x, times)
replace : function (x, list, values)
replicate : function (n, expr, simplify = TRUE)
rep.numeric_version : function (x, ...)
rep.POSIXct : function (x, ...)
rep.POSIXlt : function (x, ...)
require : function (package, lib.loc = NULL, quietly = FALSE,
warn.conflicts = TRUE,
    keep.source = getOption("keep.source.pkgs"), character.only = FALSE,
    save = TRUE)
restart : function ()
restartDescription : function (r)
restartFormals : function (r)
retracemem : function (x, previous = NULL)
return : .Primitive("return")
rev : function (x)
rev.default : function (x)
R.home : function (component = "home")
rle : function (x)
rm : function (..., list = character(0L), pos = -1, envir =
as.environment(pos),
    inherits = FALSE)
RNGkind : function (kind = NULL, normal.kind = NULL)
RNGversion : function (vstr)
round : function (x, digits = 0)
round.Date : function (x, ...)
round.POSIXt : function (x, units = c("secs", "mins", "hours", "days"))
row : function (x, as.factor = FALSE)
rowMeans : function (x, na.rm = FALSE, dims = 1L)
rownames : function (x, do.NULL = TRUE, prefix = "row")
row.names : function (x)
row.names<- : function (x, value)
rownames<- : function (x, value)
row.names<-.data.frame : function (x, value)
row.names.data.frame : function (x)
row.names<-.default : function (x, value)
row.names.default : function (x)
rowsum : function (x, group, reorder = TRUE, ...)
rowsum.data.frame : function (x, group, reorder = TRUE, na.rm = FALSE, ...)
rowsum.default : function (x, group, reorder = TRUE, na.rm = FALSE, ...)
rowSums : function (x, na.rm = FALSE, dims = 1L)
R_system_version : function (x, strict = TRUE)
R.Version : function ()
sample : function (x, size, replace = FALSE, prob = NULL)
sample.int : function (n, size, replace = FALSE, prob = NULL)
sapply : function (X, FUN, ..., simplify = TRUE, USE.NAMES = TRUE)
save : function (..., list = character(0L), file = stop("'file' must
be specified"),
    ascii = FALSE, version = NULL, envir = parent.frame(), compress = !ascii,
    compression_level, eval.promises = TRUE, precheck = TRUE)
save.image : function (file = ".RData", version = NULL, ascii = FALSE,
compress = !ascii,
    safe = TRUE)
scale : function (x, center = TRUE, scale = TRUE)
scale.default : function (x, center = TRUE, scale = TRUE)
scan : function (file = "", what = double(0), nmax = -1, n = -1, sep = "",
    quote = if (identical(sep, "\n")) "" else "'\"", dec = ".",
    skip = 0, nlines = 0, na.strings = "NA", flush = FALSE, fill = FALSE,
    strip.white = FALSE, quiet = FALSE, blank.lines.skip = TRUE,
    multi.line = TRUE, comment.char = "", allowEscapes = FALSE,
    encoding = "unknown")
scan.url : function (url, file = tempfile(), method, ...)
search : function ()
searchpaths : function ()
seek : function (con, ...)
seek.connection : function (con, where = NA, origin = "start", rw = "", ...)
seq : function (...)
seq_along : function (along.with)
seq.Date : function (from, to, by, length.out = NULL, along.with = NULL,
    ...)
seq.default : function (from = 1, to = 1, by = ((to - from)/(length.out - 1)),
    length.out = NULL, along.with = NULL, ...)
seq.int : function (from, to, by, length.out, along.with, ...)
seq_len : function (length.out)
seq.POSIXt : function (from, to, by, length.out = NULL, along.with = NULL,
    ...)
sequence : function (nvec)
serialize : function (object, connection, ascii = FALSE, refhook = NULL)
setCConverterStatus : function (id, status)
setdiff : function (x, y)
setequal : function (x, y)
setHook : function (hookName, value, action = c("append", "prepend",
"replace"))
setNamespaceInfo : function (ns, which, val)
set.seed : function (seed, kind = NULL, normal.kind = NULL)
setSessionTimeLimit : function (cpu = Inf, elapsed = Inf)
setTimeLimit : function (cpu = Inf, elapsed = Inf, transient = FALSE)
setwd : function (dir)
showConnections : function (all = FALSE)
shQuote : function (string, type = c("sh", "csh", "cmd"))
sign : function (x)
signalCondition : function (cond)
signif : function (x, digits = 6)
simpleCondition : function (message, call = NULL)
simpleError : function (message, call = NULL)
[.simple.list : function (x, i, ...)
simpleMessage : function (message, call = NULL)
simpleWarning : function (message, call = NULL)
sin : function (x)
single : function (length = 0)
sinh : function (x)
sink : function (file = NULL, append = FALSE, type = c("output", "message"),
    split = FALSE)
sink.number : function (type = c("output", "message"))
slice.index : function (x, MARGIN)
socketConnection : function (host = "localhost", port, server = FALSE,
blocking = FALSE,
    open = "a+", encoding = getOption("encoding"))
socketSelect : function (socklist, write = FALSE, timeout = NULL)
solve : function (a, b, ...)
solve.default : function (a, b, tol = ifelse(LINPACK, 1e-07,
.Machine$double.eps),
    LINPACK = FALSE, ...)
solve.qr : function (a, b, ...)
sort : function (x, decreasing = FALSE, ...)
sort.default : function (x, decreasing = FALSE, na.last = NA, ...)
sort.int : function (x, partial = NULL, na.last = NA, decreasing = FALSE,
    method = c("shell", "quick"), index.return = FALSE)
sort.list : function (x, partial = NULL, na.last = TRUE, decreasing = FALSE,
    method = c("shell", "quick", "radix"))
sort.POSIXlt : function (x, decreasing = FALSE, na.last = NA, ...)
source : function (file, local = FALSE, echo = verbose, print.eval = echo,
    verbose = getOption("verbose"), prompt.echo = getOption("prompt"),
    max.deparse.length = 150, chdir = FALSE, encoding = getOption("encoding"),
    continue.echo = getOption("continue"), skip.echo = 0, keep.source
= getOption("keep.source"))
source.url : function (url, file = tempfile(), method, ...)
split : function (x, f, drop = FALSE, ...)
split<- : function (x, f, drop = FALSE, ..., value)
split<-.data.frame : function (x, f, drop = FALSE, ..., value)
split.data.frame : function (x, f, drop = FALSE, ...)
split.Date : function (x, f, drop = FALSE, ...)
split<-.default : function (x, f, drop = FALSE, ..., value)
split.default : function (x, f, drop = FALSE, ...)
split.POSIXct : function (x, f, drop = FALSE, ...)
sprintf : function (fmt, ...)
sqrt : function (x)
sQuote : function (x)
srcfile : function (filename, encoding = getOption("encoding"))
srcfilecopy : function (filename, lines)
srcref : function (srcfile, lloc)
standardGeneric : function (f)
stderr : function ()
stdin : function ()
stdout : function ()
stop : function (..., call. = TRUE, domain = NULL)
stopifnot : function (...)
storage.mode : function (x)
storage.mode<- : function (x, value)
strftime : function (x, format = "", tz = "", usetz = FALSE, ...)
strptime : function (x, format, tz = "")
strsplit : function (x, split, extended = TRUE, fixed = FALSE, perl = FALSE,
    useBytes = FALSE)
strtrim : function (x, width)
structure : function (.Data, ...)
strwrap : function (x, width = 0.9 * getOption("width"), indent = 0,
exdent = 0,
    prefix = "", simplify = TRUE, initial = prefix)
sub : function (pattern, replacement, x, ignore.case = FALSE, extended = TRUE,
    perl = FALSE, fixed = FALSE, useBytes = FALSE)
subset : function (x, ...)
subset.data.frame : function (x, subset, select, drop = FALSE, ...)
subset.default : function (x, subset, ...)
subset.matrix : function (x, subset, select, drop = FALSE, ...)
substitute : function (expr, env)
substr : function (x, start, stop)
substr<- : function (x, start, stop, value)
substring : function (text, first, last = 1000000L)
substring<- : function (text, first, last = 1000000L, value)
sum : function (..., na.rm = FALSE)
summary : function (object, ...)
summary.connection : function (object, ...)
summary.data.frame : function (object, maxsum = 7, digits = max(3,
getOption("digits") -
    3), ...)
Summary.data.frame : function (..., na.rm)
summary.Date : function (object, digits = 12, ...)
Summary.Date : function (..., na.rm)
summary.default : function (object, ..., digits = max(3, getOption("digits") -
    3))
Summary.difftime : function (..., na.rm)
summary.factor : function (object, maxsum = 100, ...)
Summary.factor : function (..., na.rm)
summary.matrix : function (object, ...)
Summary.numeric_version : function (..., na.rm)
summary.POSIXct : function (object, digits = 15, ...)
Summary.POSIXct : function (..., na.rm)
summary.POSIXlt : function (object, digits = 15, ...)
Summary.POSIXlt : function (..., na.rm)
summary.table : function (object, ...)
suppressMessages : function (expr)
suppressPackageStartupMessages : function (expr)
suppressWarnings : function (expr)
svd : function (x, nu = min(n, p), nv = min(n, p), LINPACK = FALSE)
sweep : function (x, MARGIN, STATS, FUN = "-", check.margin = TRUE, ...)
switch : function (EXPR, ...)
symbol.C : function (name)
symbol.For : function (name)
sys.call : function (which = 0)
sys.calls : function ()
Sys.chmod : function (paths, mode = "0777")
Sys.Date : function ()
sys.frame : function (which = 0)
sys.frames : function ()
sys.function : function (which = 0)
Sys.getenv : function (x = NULL, unset = "")
Sys.getlocale : function (category = "LC_ALL")
Sys.getpid : function ()
Sys.glob : function (paths, dirmark = FALSE)
Sys.info : function ()
sys.load.image : function (name, quiet)
Sys.localeconv : function ()
sys.nframe : function ()
sys.on.exit : function ()
sys.parent : function (n = 1)
sys.parents : function ()
Sys.putenv : function (...)
Sys.readlink : function (paths)
sys.save.image : function (name)
Sys.setenv : function (...)
Sys.setlocale : function (category = "LC_ALL", locale = "")
Sys.sleep : function (time)
sys.source : function (file, envir = baseenv(), chdir = FALSE,
keep.source = getOption("keep.source.pkgs"))
sys.status : function ()
system : function (command, intern = FALSE, ignore.stderr = FALSE, wait = TRUE,
    input = NULL, show.output.on.console = TRUE, minimized = FALSE,
    invisible = TRUE)
system.file : function (..., package = "base", lib.loc = NULL)
system.time : function (expr, gcFirst = TRUE)
Sys.time : function ()
Sys.timezone : function ()
Sys.umask : function (mode = "0000")
Sys.unsetenv : function (x)
Sys.which : function (names)
t : function (x)
table : function (..., exclude = if (useNA == "no") c(NA, NaN), useNA = c("no",
    "ifany", "always"), dnn = list.names(...), deparse.level = 1)
tabulate : function (bin, nbins = max(1L, bin, na.rm = TRUE))
tan : function (x)
tanh : function (x)
tapply : function (X, INDEX, FUN = NULL, ..., simplify = TRUE)
taskCallbackManager : function (handlers = list(), registered = FALSE,
verbose = FALSE)
tcrossprod : function (x, y = NULL)
t.data.frame : function (x)
t.default : function (x)
tempdir : function ()
tempfile : function (pattern = "file", tmpdir = tempdir())
testPlatformEquivalence : function (built, run)
tetragamma : function (x)
textConnection : function (object, open = "r", local = FALSE, encoding = c("",
    "bytes", "UTF-8"))
textConnectionValue : function (con)
tolower : function (x)
topenv : function (envir = parent.frame(), matchThisEnv =
getOption("topLevelEnvironment"))
toString : function (x, ...)
toString.default : function (x, width = NULL, ...)
toupper : function (x)
trace : function (what, tracer, exit, at, print, signature, where =
topenv(parent.frame()),
    edit = FALSE)
traceback : function (x = NULL, max.lines = getOption("deparse.max.lines"))
tracemem : function (x)
tracingState : function (on = NULL)
transform : function (`_data`, ...)
transform.data.frame : function (`_data`, ...)
transform.default : function (`_data`, ...)
trigamma : function (x)
trunc : function (x, ...)
truncate : function (con, ...)
truncate.connection : function (con, ...)
trunc.Date : function (x, ...)
trunc.POSIXt : function (x, units = c("secs", "mins", "hours", "days"), ...)
try : function (expr, silent = FALSE)
tryCatch : function (expr, ..., finally)
typeof : function (x)
unclass : function (x)
undebug : function (fun)
union : function (x, y)
unique : function (x, incomparables = FALSE, ...)
unique.array : function (x, incomparables = FALSE, MARGIN = 1,
fromLast = FALSE,
    ...)
unique.data.frame : function (x, incomparables = FALSE, fromLast = FALSE, ...)
unique.default : function (x, incomparables = FALSE, fromLast = FALSE, ...)
unique.matrix : function (x, incomparables = FALSE, MARGIN = 1,
fromLast = FALSE,
    ...)
unique.numeric_version : function (x, incomparables = FALSE, ...)
unique.POSIXlt : function (x, incomparables = FALSE, ...)
units : function (x)
units<- : function (x, value)
units<-.difftime : function (x, value)
units.difftime : function (x)
unix : function (call, intern = FALSE)
unix.time : function (expr, gcFirst = TRUE)
unlink : function (x, recursive = FALSE)
unlist : function (x, recursive = TRUE, use.names = TRUE)
unloadNamespace : function (ns)
unlockBinding : function (sym, env)
unname : function (obj, force = FALSE)
unserialize : function (connection, refhook = NULL)
unsplit : function (value, f, drop = FALSE)
untrace : function (what, signature = NULL, where = topenv(parent.frame()))
untracemem : function (x)
unz : function (description, filename, open = "", encoding =
getOption("encoding"))
upper.tri : function (x, diag = FALSE)
url : function (description, open = "", blocking = TRUE, encoding =
getOption("encoding"))
UseMethod : function (generic, object)
utf8ToInt : function (x)
vector : function (mode = "logical", length = 0)
Vectorize : function (FUN, vectorize.args = arg.names, SIMPLIFY =
TRUE, USE.NAMES = TRUE)
Version : function ()
warning : function (..., call. = TRUE, immediate. = FALSE, domain = NULL)
warnings : function (...)
weekdays : function (x, abbreviate)
weekdays.Date : function (x, abbreviate = FALSE)
weekdays.POSIXt : function (x, abbreviate = FALSE)
which : function (x, arr.ind = FALSE)
which.max : function (x)
which.min : function (x)
while : .Primitive("while")
with : function (data, expr, ...)
withCallingHandlers : function (expr, ...)
with.default : function (data, expr, ...)
within : function (data, expr, ...)
within.data.frame : function (data, expr, ...)
within.list : function (data, expr, ...)
withRestarts : function (expr, ...)
withVisible : function (x)
write : function (x, file = "data", ncolumns = if (is.character(x)) 1 else 5,
    append = FALSE, sep = " ")
writeBin : function (object, con, size = NA_integer_, endian =
.Platform$endian,
    useBytes = FALSE)
writeChar : function (object, con, nchars = nchar(object, type = "chars"),
    eos = "", useBytes = FALSE)
write.dcf : function (x, file = "", append = FALSE, indent = 0.1 *
getOption("width"),
    width = 0.9 * getOption("width"))
writeLines : function (text, con = stdout(), sep = "\n", useBytes = FALSE)
write.table0 : function (x, file = "", append = FALSE, quote = TRUE, sep = " ",
    eol = "\n", na = "NA", dec = ".", row.names = TRUE, col.names = TRUE,
    qmethod = c("escape", "double"))
%x% : function (X, Y)
xor : function (x, y)
xpdrows.data.frame : function (x, old.rows, new.rows)
xtfrm : function (x)
xtfrm.Date : function (x)
xtfrm.default : function (x)
xtfrm.factor : function (x)
xtfrm.numeric_version : function (x)
xtfrm.POSIXct : function (x)
xtfrm.POSIXlt : function (x)
xtfrm.Surv : function (x)
xzfile : function (description, open = "", encoding = getOption("encoding"),
    compression = 6)
zapsmall : function (x, digits = getOption("digits"))
>
>


On 9/26/10, Carson Farmer <carson.farmer at gmail.com> wrote:
> Noli,
>
> What do you get (using a freshly started R, with no packages manually
> loaded), why you type something like:
> lsf.str("package:base")
>
> Carson
>
> On 26 September 2010 11:57, Noli Sicad <nsicad at gmail.com> wrote:
>> It seems that I have utils package.
>>
>> noli at noli-laptop:~$ R
>>
>> R version 2.10.1 (2009-12-14)
>> Copyright (C) 2009 The R Foundation for Statistical Computing
>> ISBN 3-900051-07-0
>>
>> R is free software and comes with ABSOLUTELY NO WARRANTY.
>> You are welcome to redistribute it under certain conditions.
>> Type 'license()' or 'licence()' for distribution details.
>>
>>  Natural language support but running in an English locale
>>
>> R is a collaborative project with many contributors.
>> Type 'contributors()' for more information and
>> 'citation()' on how to cite R or R packages in publications.
>>
>> Type 'demo()' for some demos, 'help()' for on-line help, or
>> 'help.start()' for an HTML browser interface to help.
>> Type 'q()' to quit R.
>>
>>> library(utils)
>>>
>>
>>
>> Noli
>>
>
>
>
> --
> Carson J. Q. Farmer
> ISSP Doctoral Fellow
> National Centre for Geocomputation
> National University of Ireland, Maynooth,
> http://www.carsonfarmer.com/
>


More information about the Qgis-developer mailing list