Displaying 10 results from an estimated 10 matches for "allnames".
2011 Aug 10
2
join columns
...re welcome, many thanks.
Anthony
> q1 = data.frame(a=1,b=2,c=3,row.names="q1")
a b c
q1 1 2 3
> q2 = data.frame(d=4,b=1,a=4, row.names="q2")
d b a
q2 4 1 4
-> myJoinColumns(q1,q2)
a b c d
q1 1 2 3 0
q2 4 1 0 4
myJoinColumns <- function(q1,q2){
allNames = sort(union(colnames(q1),colnames(q2)))
for (i in 1:length(allNames)){
t1 = which(colnames(q1) == allNames[i])
t2 = which(colnames(q2) == allNames[i])
if (length(t1) == 1){
sec1 = q1[,t1]
} else {
sec1 = 0
}
if (length(t2) == 1){
sec2 = q2[,t2]
} e...
2024 Feb 07
1
[EXTERNAL] Re: NOTE: multiple local function definitions for ?fun? with different formal arguments
I put the idea below into a function that gives nicer looking results.
Here's the new code:
dupnames <- function(path = ".") {
Rfiles <- pkgload:::find_code(path)
allnames <- data.frame(names=character(), filename=character(), line
= numeric())
result <- NULL
for (f in Rfiles) {
exprs <- parse(f, keep.source = TRUE)
locs <- getSrcLocation(exprs)
names <- character(length(exprs))
lines <- numeric(length(exprs))
for (i...
2013 Apr 08
0
A categorized list of R functions
.... Michael Weylandt
# 08-04-2013
# this version produces a tab-delimited text file with
# the columns: (search) pattern; (in which) package and function (name).
# ======================================================================
allfuncs = unlist(sapply(search(), ls))
n = length(allfuncs)
allnames = names(allfuncs)
package.names = substr(allnames, start=9, stop=nchar(allnames))
allfuncs = cbind(package.names, allfuncs)
# which patterns to search: can be customized
patterns = c("print", "plot", "axes", "axis", "color", "file", "...
2012 Aug 02
4
Subseting
Hi everyone
I have banking data set in long format with 4 columns.One of these columns
is bank name which consist of 49 banks and I want the data for only 40
banks out of these 49
so can anyone help me on how to get this 40 banks data
My data looks like
Year Name totalliabilties assets
1990 a 90 10
1991 a 89 48
1992 a 87
2007 Apr 05
2
creating a data frame from a list
Dear all,
A few months ago, I asked for your help on the following problem:
I have a list with three (named) numeric vectors:
> lst = list(a=c(A=1,B=8) , b=c(A=2,B=3,C=0), c=c(B=2,D=0) )
> lst
$a
A B
1 8
$b
A B C
2 3 0
$c
B D
2 0
Now, I'd love to use this list to create the following data frame:
> dtf = data.frame(a=c(A=1,B=8,C=NA,D=NA),
+
2011 Sep 20
0
Problems using predict from GAM model averaging (MuMIn)
...E),max(x,
na.rm=TRUE), length=len)
newdata$x1 <- nseq(dat$x1, nrow(newdata))
The problem comes in when I try do the following:
pred <- cbind(sapply(top.models, predict,
newdata=newdata),averaged=predict(model.avg(top.models), newdata))
I get the following error: "Error in reformulate(allNames) :
'termlabels' must be a character vector of length at least one"
I think the problem has something to do with the fact that I have used 3
knots in the GAM and therefore I land up with two coefficients for each
factor, but I have no idea how to get around this problem.
--
Vernon...
2002 Dec 05
2
crimson editor
Hello,
Sorry about the last email, I just found the shortcutkey for sending, by
mistake :-(
OK. I am a windows user and I wanted to instal emacs. However, went to
speak with the information staf on the institut and they told me that that
is a bit problematic sometimes, and that there is a free soft that could do
a very similar job which is crimson...
This is like a note pad, but highlights the
2012 May 03
1
Proposal: model.data
...ed. This function will fail if the model was not fit
##' with the data option.
##' @return A data frame
##' @export
##' @author Paul E. Johnson <pauljohn@@ku.edu>
##' @example inst/examples/model.data-ex.R
model.data <- function(model){
fmla <- formula(model)
allnames <- all.vars(fmla) ## all variable names
## indep variables, includes d in poly(x,d)
ivnames <- all.vars(formula(delete.response(terms(model))))
## datOrig: original data frame
datOrig <- eval(model$call$data, environment(formula(model)))
if (is.null(datOrig))stop("...
2000 Feb 17
2
Installation of rpm file on Suse Linux 6.2 (PR#449)
...ry/base/R-ex/airquality.R action: create
D: file: /usr/local/lib/R/library/base/R-ex/alias.R action: create
D: file: /usr/local/lib/R/library/base/R-ex/all.R action: create
D: file: /usr/local/lib/R/library/base/R-ex/all.equal.R action: create
D: file: /usr/local/lib/R/library/base/R-ex/allnames.R action: create
D: file: /usr/local/lib/R/library/base/R-ex/anscombe.R action: create
D: file: /usr/local/lib/R/library/base/R-ex/any.R action: create
D: file: /usr/local/lib/R/library/base/R-ex/aov.R action: create
D: file: /usr/local/lib/R/library/base/R-ex/aperm.R action: create
D:...
2002 Jul 11
1
dyn.load tcl/tk (PR#1774)
...html latex example
airquality text html latex example
alias text html latex example
all text html latex example
all.equal text html latex example
allnames text html latex example
anova text html latex
anova.glm text html latex example
anova.lm text html latex example
anscombe text html...