Function principal() in psych takes a correlation matrix so use cov2cor() to
convert:
library(psych)
iris.pca <- principal(cov2cor(cov(iris[,-5])), nfactors=4, rotate="none")
print(iris.pca$Structure, cutoff=0)
David
-Original Message-
From: R-help [mailto:r-help-boun...@r-project.org] O
ums of the squared values in each column sum to the eigenvalue.
Alternatively, you can install the "psych" package which computes the pattern
(structure) matrix directly:
> library(psych)
> iris.pca <- principal(iris[,-5], nfactors=4, rotate="none")
> print(iris.
Looking at package poLCA I see functions poLCA.predcell() and poLCA.table(). If
these do not do what you want, you will need to be clearer and provide a
reproducible example.
-
David L Carlson
Department of Anthropology
Texas A&M University
College Sta
6"
> t(t(a))
[,1]
[1,] "String 1"
[2,] "String 2"
. . .
[15,] "String 15"
[16,] "String 16"
> b <- a
> dim(b) <- c(16, 1)
> b
[,1]
[1,] "String 1"
[2,] "String 2"
. . .
[15,] "
0 7 1
4 0 4 0 7 1
5 0 1 0 0 0
6 0 0 0 0 0
7 0 0 0 0 0
8 0 0 0 0 0
9 0 0 1 5 0
10 0 5 1 5 0
11 0 4 1 5 0
12 0 8 4 7 3
13 0 0 3 0 0
14 0 0 3 4 0
15 0 0 3 4 0
16 0 0 0 5 0
17 0 2 0 6 0
18 0 0 4 0 1
19 0 0 4 0 1
20 0 0 4 0 1
-------------
pause(1)
# Draw the curve pausing between points.
for(i in 1:6) {
ani.pause(diftime[i]*10) # Multiply by ten to slow things down
segments(pen$x[i], pen$y[i], pen$x[i+1], pen$y[i+1])
}
-
David L Carlson
Department of Anthropology
Texas A&M Univer
dframe[sample(ind, ifelse(length(ind)>2, 3, length(ind))),]
}
Now take the samples and combine them into a single data frame:
sample <- do.call(rbind, lapply(dta.list, smp))
sample
-
David L Carlson
Department of Anthropology
Texas A&M Uni
time(today, "%m/%d/%y") < strptime(d1, "%m/%d/%y"))
[1] 0
> as.integer(strptime(today, "%m/%d/%y") < strptime(d2, "%m/%d/%y"))
[1] 1
?strptime for details
-
David L Carlson
Department of Anthropology
Texas A&M
e original data and delete the unused factor
levels:
sample <- merge(Dataset, g[,-3])
sample$ctry <- factor(sample$ctry)
sample$member <- factor(sample$member)
---------
David L Carlson
Department of Anthropology
Texas A&M University
College Station, T
cumulative VALUE?
-
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77840-4352
-Original Message-
From: R-help [mailto:r-help-boun...@r-project.org] On Behalf Of Matthias Weber
Sent: Monday, March 9, 2015 7:46 A
6 1 1200
3 13 3 9 6 1800
4 14 2 11 9 1800
-
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77840-4352
-Original Message-
From: Jeff Newmiller [mailto:jdnew...@dcn.davis.ca.us]
Sent: Monday, March 9, 201
The merge function combines 2, not 3 files at a time. Maybe
rich.stats2 = merge(rich.stats, Month, by="X.SampleID")
rich.stats3 = merge(rich.stats2, Location, by="X.SampleID")
Reading the manual page will help:
?merge
---------
David L C
eliminate the warnings.
-
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77840-4352
-Original Message-
From: R-help [mailto:r-help-boun...@r-project.org] On Behalf Of Fraser D. Neiman
Sent: Friday, March 13, 2015 3:2
does a better job of avoiding labels being chopped at the plot
margins.
-
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77840-4352
-Original Message-
From: R-help [mailto:r-help-boun...@r-project.org] On Behal
benefit from spending a little time learning about R using a free
tutorial.
-
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77840-4352
-Original Message-
From: R-help [mailto:r-help-boun...@r-project.org] On Be
=="1"), decreasing=TRUE),]
or
dat[order(rowSums(dat), decreasing=TRUE),]
or
dat[order(rowSums(dat, na.rm=TRUE), decreasing=TRUE),]
Note that the order is not unique since there are ties in the number of 1s.
-----
David L Carlson
Department of Anthropolo
>From Sarah's data frame you can get what you want directly with the table()
>function which will create a table object, mydf.tbl. If you want a data frame
>you need to convert the table using as.data.frame.matrix() to make mydf.df.
>Finally combine the two data frames if your x column consists
DC0B0
So most colors do not have names. In your example, none of the colors in
rainbow(6) have names:
> rain <- rainbow(6)
> sum(clrs$RGB %in% rain)
[1] 0
-
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 7
rainbow(6):
> for (i in 1:6) cat(i, colors()[clrs$RGB==rain[i]], "\n")
1 red red1
2 yellow yellow1
3 green green1
4 cyan cyan1
5 blue blue1
6 magenta magenta1
David C
-Original Message-
From: R-help [mailto:r-help-boun...@r-project.org] On Behalf Of David L Carlson
Sent:
R Studio
cannot fine it.
---------
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77840-4352
-Original Message-
From: R-help [mailto:r-help-boun...@r-project.org] On Behalf Of Jeff Newmiller
Sent: Tuesday, April 14, 2015 7:43 AM
To: John Kane; Sojood
nths)
Group <- grps[rainfall$Month]
aggregate(Rain~Year+Group, rainfall, function(x) c(sum=sum(x),
days=sum(x>0)))
}
> rainstats(rainfall)
Year Group Rain.sum Rain.days
1 1979 10 0
---------
David L Carlson
Department of
"The Elements of Programming Style" by Kernighan and Plauger:
10.0 times 0.1 is hardly ever 1.0.
-----
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77840-4352
-Original Message-
From: R-help [
It is not vectorized, but it is simple:
EXPANDED <- unlist(mapply(":", START, END))
-----
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77840-4352
-Original Message-
From: R-help [mailto:r-help-boun
of the space= argument useful.
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77843-4352
-Original Message-
From: R-help On Behalf Of c...@disroot.org
Sent: Friday, August 17, 2018 6:56 AM
To: r-he
'A-level grades, chemistry', beside=T,
+ space=c(0, 1), ylim=c(0,35))
I defined clrs so that the barplot() function would be easier to read, but it
works the same your way. Now we just need legend=TRUE and we can position the
legend in the top right with the args.legend= argument.
The load() function is only used for binary files that R creates with the
save() function.
You are trying to assign the data to an object (variable) called LGG Drug. R
does not allow spaces in variable names. You could try LGGDrug, LGG_Drug, or
LGG.Drug. Same issue with GBM Drug.
David L
There are some materials at
https://www-users.cs.umn.edu/~kumar001/dmbook/index.php
Michael Hahsler has code examples at
https://mhahsler.github.io/Introduction_to_Data_Mining_R_Examples/
https://github.com/mhahsler/Introduction_to_Data_Mining_R_Examples
David L. Carlson
Department of
Another approach to adding GW_Elevation to the year value, but the table is
more compact with just the year.
dta <- read.csv("http://doylesdartden.com/R/ExampleData.csv";)
Years <- paste("GW_Elevation", dta$Year)
xtabs(GW_Elevation~Location+Years, dta)
Davi
sy and you will
get halos when you zoom in.
You can always preserve a vector version for publication. If you have Adobe
Acrobat (not Reader), you can Save As Other | Image | tiff (or png) and set the
resolution before exporting.
--------
David L. Carlson
Department of Anthropo
the plot you included with
your message?
--------
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77843-4352
-Original Message-
From: R-help On Behalf Of Ogbos Okike
Sent: Tuesday, September 4, 2018 2:35 PM
To: r-help
002371 -0.37492894 0.46477742 -0.37972866
Change sapply() to lapply() to get list output.
--------
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77843-4352
-Original Message-
From: R-help On Behalf Of David Disabato
instead of the loop.
--------
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77843-4352
-Original Message-
From: R-help On Behalf Of Lynette Chang
Sent: Thursday, September 20, 2018 10:09 AM
To: r-help@r-project.org
Subject: [R] How to vector
> xt[, 2:3] %>% colMeans
y z
2.500 -0.4401625
> xt[2] %>% colMeans
y
2.5
> t(xt[, 2]) %>% mean
[1] 2.5
---------
David L. Carlson
Department of Anthropology
Texas A&M University
-Original Message-
From: R-help [m
[1.79,1.99)5
[1.99,2.19]6
--------
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77843-4352
-Original Message-
From: R-help On Behalf Of Jose Claudio Faria
Sent: Monday, September 24, 2018 9:32 AM
To: r-help@r-project.or
on a point of division between
two intervals."
--------
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77843-4352
-Original Message-
From: Jeff Newmiller
Sent: Monday, September 24, 2018 10:41 AM
To: r-help@r-projec
t(dat, breaks= bks, right=FALSE, dig.lab=10L))
> levels(f) <- lvls
> levels(f)
[1] "[0.6,0.8)" "[0.8,1)" "[1,1.2)" "[1.2,1.4)" "[1.4,1.6)" "[1.6,1.8)"
[7] "[1.8,2)" "[2,2.2)"
---
ot;Legend", xpd=TRUE)
--------
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77843-4352
-Original Message-
From: R-help On Behalf Of Ding, Yuan Chun
Sent: Thursday, October 4, 2018 1:19 PM
To: r-help@r-project.org
Subject: Re: [R] heatmap.2, adding a
You probably need to read up on the scipen= argument in ?options. What is
displayed at the console is not what is stored:
> x <- 1619052826499
> print(x)
[1] 1.619053e+12
> dput(x)
1619052826499
> options(scipen=10)
> print(x)
[1] 1619052826499
--------
() to close the space between the
tickmarks and their values.
--
David L. Carlson
Department of Anthropology
Texas A&M University
-Original Message-
From: R-help [mailto:r-help-boun...@r-project.org] On Behalf Of Steven Yen
Sent: Sunday, October 21, 2018 1:47
dnorm(x,0,1), xlim=c(-5, 5), frame=F)
--------
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77843-4352
From: Steven Yen
Sent: Sunday, October 21, 2018 9:54 PM
To: David L Carlson
Subject: Re: [R] Polygon
Thank you Dav
the xlim= argument so that the legend does not print on
top of the bars.
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77843-4352
-Original Message-
From: R-help On Behalf Of P. Roberto Bakker
Sent: Mon
d.y, 0), col="skyblue")
axis(1,at=c(-5,z1,0,z2,5),lab=c(-5,z1,0,z2,5))
abline(v=c(z1,z2))
axis(1, at=c(-5, z1, 0, z2, 5), lab=(c(-5,z1,0,z2,5) + 5)*2, line=2)
segments(.5, .1, 3, .2, lwd=2)
lbl <- paste0("Area = ", round(pnorm(2) - pnorm(-1), 4))
text(3, .2, lbl, pos=4, offset=.2
# 5 283 381 224 114
# 6 266 364 207 97 17
# 7 297 395 238 128 14 31
# 8 358 456 299 189 75 92 61
# 9 308 406 249 139 25 42 11 50
Now we can plot. I've attached a copy:
plot(daydiff, mcdf2)
You need to read the following manual
You should probably contact the packages maintainer about this.
maintainer("WaveletComp") # Notice capitalization
[1] Angi Roesch
--------
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77843-4352
-Or
9)
Error in seq.default(x, 9) : 'from' must be of length 1
> rep(1, x)
Error in rep(1, x) : invalid 'times' argument
------------
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77843-4352
-Original
of the categories
in your predictor variables or increasing your sample size. Are your predictor
variables coded as factors?
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77843-4352
-Original Message-
0 10
> xtabs(~V1+V3, df) # No cells < 2 with V1, V3
V3
V1 9 16 23
200 10 10 10
350 10 10 10
500 10 10 10
> xtabs(~V2+V3, df) # No cells < 2 with V2, V3
V3
V29 16 23
8 10 10 10
16 10 10 10
24 10 10 10
David L. Carlson
Department of Anthropology
Tex
ev(rownames(DF2)), ]
> DF2
longitude
latitude 110.5 111 111.5 112
46 6.1 4.5 7.8 5.5
45.5 3.2 5.0 1.8 2.0
# Convert to a data frame
> DF2 <- as.data.frame.matrix(DF2)
> DF2
110.5 111 111.5 112
46 6.1 4.5 7.8 5.5
45.5 3.2 5.0 1.8 2.0
---
F3) <- c("latitude", "longitude", "Precip")
> DF3$latitude <- as.numeric(as.character(DF3$latitude))
> DF3$longitude <- as.numeric(as.character(DF3$longitude))
David L Carlson
Department of Anthropology
Texas A&am
just learning about R. You might find this
list useful:
https://goo.gl/huajyf
--------
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77843-4352
-Original Message-
From: R-help On Behalf Of Olofinsao Tosin
S
esn't put you on the right track, give us a .csv file of a subset of
the data (e.g. 10 columns and 20 rows) to play with. You can just copy/paste it
into your message. If you save it as an attachment, rename the extension to
.txt so the list processor does not strip it out.
David L. Carlson
script window
in R Commander if you need to do something that is not available on the menus.
If you want to use R, you are really going to have to invest a bit of time
understanding how the program works. There are many free resources to help you
learn more about R.
David L. Carlson
Department of
of the empirical values, I can't say if this approach is
wise.
---
David L. Carlson
Department of Anthropology
Texas A&M University
-Original Message-
From: R-help [mailto:r-help-boun...@r-project.org] On Behalf Of Fatma Ell
Sent: Sunday, December
[[1]]
----
David L. Carlson
Department of Anthropology
Texas A&M University
-Original Message-
From: R-help [mailto:r-help-boun...@r-project.org] On Behalf Of Bert Gunter
Sent: Saturday, December 8, 2018 9:46 AM
To: bill.pol...@zelis.com
Cc: R-help
Subject: Re: [R] Help with K-Means
u don't seem to know the difference between R and
R-Studio.
--------
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77843-4352
-Original Message-
From: R-help On Behalf Of Miller, Shawn
Sent: Thursday, Decembe
.xlsx". Have you confirmed that all of the dates you
need are present in that file?
--------
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77843-4352
-Original Message-
From: Miller, Shawn
Sent: Thursday, Dec
(wqn.last5yrs$DATE_COLLECTED)
David C
-Original Message-
From: Miller, Shawn
Sent: Thursday, December 13, 2018 1:42 PM
To: David L Carlson
Cc: R-help@r-project.org
Subject: RE: [External] RE: help
Yes I confirmed all the dates I need are in the test.xlsx table. The
final.2.xlsx table
Each of the backslashes need to be escaped with a backslash:
> ctxt <- "In Alvarez Cabral street by no. 105.\\000"
> sub("000", "", ctxt)
[1] "In Alvarez Cabral street by no. 105."
-----------
Davi
5
8 V1:9 V6:9 V4:8 V8:8 V7:7
9 V4:8 V10:6 V9:5 V3:4 V5:3
Which seems to be what you wanted.
---------
David L. Carlson
Department of Anthropology
Texas A&M University
-Original Message-
From: R-help [mailto:r-help-boun...@r-project.org]
package RcmdrMisc, Desc() in DescTools, describe() in
Hmisc, stat.desc() in pastecs, or describe() in psych. Try several until you
find one that formats the results the way you want.
---
David L. Carlson
Department of Anthropology
Texas A&M University
-Orig
and the
degrees of freedom. You have run kruskal.test separately on each sample. The
kruskal.test is designed for comparing two or more samples.
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77843-4352
-Orig
ot; "not(D)"
$C
[1] "D"
> TF.and <- lapply(TF.list, paste, collapse=" and ")
> TF.final <- lapply(names(TF.and), function(x) paste(x, "=", TF.and[[x]]))
> TF.final <- do.call(rbind, TF.final)
> TF.final
[,1]
A and B) and not(B).
David C
-Original Message-
From: Jeff Newmiller [mailto:jdnew...@dcn.davis.ca.us]
Sent: Monday, January 7, 2019 11:04 AM
To: Priya Arasu ; Priya Arasu via R-help
; David L Carlson ; David Winsemius
; r-help@r-project.org
Subject: Re: [R] Merge the data from multiple
becomes NAs which is probably not what you want.
The error message is because you passed genod (a data frame) to the
snpgdsCreateGeno() function not genod2 (the matrix you created from genod).
--------
David L. Carlson
Department of Anthropology
Texas A&M Universi
Now you have pushed a numeric matrix to the function with a column of missing
values. No wonder you do not get any results.
David C
-Original Message-
From: N Meriam [mailto:meriam@gmail.com]
Sent: Tuesday, January 8, 2019 3:44 PM
To: David L Carlson
Cc: Michael Dewey ; r-help@r
tor w/ 3 levels "v1","v2","v3": 1 1 1 1 1 2 2 2 2 2 ...
Then table (or xtabs) will work:
> Data.tbl <- table(Data.stack)
> addmargins(Data.tbl, 2)
ind
values v1 v2 v3 Sum
A 2 3 5 10
B 3 2 0 5
D
atrix of correlation
coefficients? If distance has different meanings between -1 and 0 and 0 and +1,
getting interpretable results from cluster analysis will be difficult, but it
is not clear what you mean by that.
-
David L. Carlson
Departme
be in
Start menu, not on the desktop.
---
David L. Carlson
Department of Anthropology
Texas A&M University
-Original Message-
From: R-help [mailto:r-help-boun...@r-project.org] On Behalf Of Eric Berger
Sent: Sunday, January 20, 2019 3:00 AM
To: Sy
1 2 3 4 5
20 20 20 20 20
> z <- findInterval(x, bks, all.inside=TRUE)
> table(z)
z
1 2 3 4 5
20 20 20 20 20
--------
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77843-4352
-Original Message
specific. Nearest
neighbor distances are also provided in several other packages, e.g. packages
FNN, distances, and RANN.
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77843-4352
-Original Message-
From: R-help
10 9 5 13 3
--------
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77843-4352
-Original Message-
From: R-help On Behalf Of Val
Sent: Monday, February 11, 2019 4:36 PM
To: r-help@R-project.org (r-help@r-project.org)
Subject: [R]
I'm not getting any error on that line in Windows 10. I did not try running
anything past that line.
Have you tried restarting R and clearing your environment?
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 7
gsAsFactors =FALSE)
df1$x2[match(df2$x1, df1$x1)] <- df2$x2
-
David L. Carlson
Department of Anthropology
Texas A&M University
-Original Message-
From: R-help [mailto:r-help-boun...@r-project.org] On Behalf Of Eric Berger
Sent: Friday, February 15, 2019 11:43 PM
To: javad bay
I'm not sure I completely understand your question. Would using grepl() instead
of grep() let you do what you want?
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77843-4352
-Original Message-
From: R
lest by 8.
Then cummin() takes the cumulative minimum so that the multiplication does not
change the decreasing order of the values. In this example the last value is
the same as the second to last instead of 8 times the original value (.0032).
The pmin() function ensures that the adjusted value never ex
hat was not fatal
because you were able to use library(vegan) to load it (i.e. you had already
installed vegan).
Based on these hints, the following code MIGHT work:
phdDist <- as.dist(phdtext)
phdMDS <- metaMDS(phdDist)
--------
David L Carlson
I searched the manual for package biomed2 and found 6 references to "AIC".
Perhaps that is your answer.
David L. Carlson
Department of Anthropology
Texas A&M University
-Original Message-
From: R-sig-ecology [mailto:r-sig-ecology-boun...@r-project.org] On Behalf Of
L
360
# Rape 21.232 9.366 7.3 46.0 20.10 50 480
----
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77843-4352
-Original Message-
From: R-help On Behalf Of David Wins
2 13 14 15 16 17 18 1920
[3,] 21 22 23 24 25
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77843-4352
-Original Message-
From: R-help On Behalf Of K. Elo
Sent: Monday, March 25, 2019 2:26 AM
To: r
, na.print=NA) # Print table with for missing values:
longitude
latitude 110.5 111 111.5 112
45.5 3.2 5.0 2.0
46 6.17.8 5.5
------------
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77843-4352
Fro
tored as mcrat["v1", ] and 100 values of ratio2 are
stored as mcrat["v2", ].
Now you can generate your summary statistics.
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77843-4352
-Origin
Inline
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77843-4352
-Original Message-
> From: R-help On Behalf Of Jenny Liu
> Sent: Sunday, March 31, 2019 6:10 PM
> To: r-help@r-project.org
Here's another approach:
> x <- c(rbind(1:100, -(1:100)))
> head(x); tail(x)
[1] 1 -1 2 -2 3 -3
[1] 98 -98 99 -99 100 -100
--------
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77843-4352
---
ee(as.hclust(asdf.ag), h=2)
[1] 1 2 2
> asdf.di <- diana(asdf)
> cutree(asdf.di, h=2)
Error in cutree(asdf.di, h = 2) :
the 'height' component of 'tree' is not sorted (increasingly)
> cutree(as.hclust(asdf.di), h=2)
[1] 1 2 2
Da
riting the value of "deviation" so you only get the
last value recycled (page 20, "The recycling rule").
---------
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77840-4352
-Original Message-
From: r-he
nred blue
2 green blue yellow red
3 green yellowred blue
4 yellowred green blue
5 yellowred green blue
6 yellowred blue green
> head(mydf2)
blue green red yellow
14 2 3 1
22 1 4 3
34 1 3 2
4 4 3 2 1
5
have enough data to test
alternate approaches. The function dput() will convert a sample of your data to
text format so that you can paste it into your email or provide it as a .txt
file.
David L. Carlson
Department of Anthropology
Texas A&M University
-Original Message-
From: r-help-
Look at package multcomp, particularly function cld().
-
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77840-4352
-Original Message-
From: r-help-boun...@r-project.org [mailto:r-help-boun...@r-project.org
;YEAR','VALUE')],
type='b',
main = ind[[i]][1, "NAME"],
. . . other commands . . . )
dev.off()
}
---------
David L Carlson
Department of Anthropology
Texas A&M University
Col
201205 28
11 DE 228 201205 28
12 AE 328 201204 28
13 CN 328 201204 28
-
David L Carlson
Department of Anthropo
...@yahoo.com]
Sent: Friday, August 8, 2014 9:03 AM
To: David L Carlson
Subject: Re: [R] color palettes
Well I'm using 1000 colors in a pie chart and get the same color but different
intensity. I can't fix myself as the number of colors are high. So what would
you suggest?
Thanks
carol
olor palettes
including RColorBrewer, colortools, colorspace, and munsell.
-
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77840-4352
-Original Message-
From: r-help-boun...@r-project.org [mailto:r-help-boun...@r-pr
You don't show us your function call, so it is hard to be certain what the
problem is. Have you read the manual page?
?predict.glm
Have you used the newdata= argument? If not, you should know that R's ability
to read your mind will not be available until the 4.0 release.
David Carlson
-
idea where those occur in the or
rather which of those variables were actually missing.
Have I explained this problem sufficiently?
I didn't think it would cause such a problem so I didn't include it in the
original problem definition.
Yours, Simon
On Jul 25, 2014, at 4:58 PM
(mymelt, row~color, value.var="rank", fill=0)
> head(mycast)
row blue green red yellow NA
1 14 0 3 2 1
2 20 2 4 1 3
3 33 2 0 1 4
4 42 4 0 3 1
5 53 4 2 0 1
6 64 3 2 0 1
Da
Try using scale=0 with the biplot function).
David C
-Original Message-
From: r-help-boun...@r-project.org [mailto:r-help-boun...@r-project.org] On
Behalf Of Jinsong Zhao
Sent: Monday, August 18, 2014 7:42 PM
To: r-help@r-project.org
Subject: Re: [R] principle component values on PCA plo
])
-
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77840-4352
From: r-help-boun...@r-project.org [mailto:r-help-boun...@r-project.org] On
Behalf Of Don McKenzie
Sent: Thursday, August 21, 2014 1:44 PM
To: Patzelt, Edward
Cc: R-help@r-project.org
Subject: Re
rocess the matrices in each list to get what you want.
David C
From: Patzelt, Edward [mailto:patz...@g.harvard.edu]
Sent: Thursday, August 21, 2014 2:58 PM
To: David L Carlson
Cc: Don McKenzie; R-help@r-project.org
Subject: Re: [R] Euclidean Distance in 3 Dimensions
Your first description is c
etween predicted 30% and actual 30%
cor <- cor(Atest$nat.r, predict(A.model, newdata = A[test,], type = "response"))
-----
David L Carlson
Department of Anthropology
Texas A&M University
College Station, TX 77840-4352
-Original Message-
Fro
values.
hist(Out) # for a histogram of the correlation values
David C
From: Angela Boag [mailto:angela.b...@colorado.edu]
Sent: Friday, August 22, 2014 4:01 PM
To: David L Carlson
Subject: Re: [R] Subsetting data for split-sample validation, then repeating
1000x
Hi David,
Thanks for the f
201 - 300 of 931 matches
Mail list logo