On 09/12/2020 6:45 p.m., Rolf Turner wrote:
On Wed, 9 Dec 2020 06:18:10 -0500
Duncan Murdoch wrote:
On 09/12/2020 3:06 a.m., Rolf Turner wrote:
I would like to produce, as graphical annotation, the Greek letter
sigma with a superscript of 2 and a subcript of 11. (I.e. the top
left hand ent
On Wed, 9 Dec 2020 06:18:10 -0500
Duncan Murdoch wrote:
> On 09/12/2020 3:06 a.m., Rolf Turner wrote:
> >
> > I would like to produce, as graphical annotation, the Greek letter
> > sigma with a superscript of 2 and a subcript of 11. (I.e. the top
> > left hand entry of a covariance matrix.)
>
On 09/12/2020 3:06 a.m., Rolf Turner wrote:
I would like to produce, as graphical annotation, the Greek letter sigma
with a superscript of 2 and a subcript of 11. (I.e. the top left hand
entry of a covariance matrix.)
I've tried:
plot(1:10,main=expression({sigma^2}[11]))
(and variants). Thi
Hi Rolf,
This is not addressing your implementation, but reformulates the goal.
Specifically, the covariance matrix is normally written as \Sigma (not
\sigma^2).
So to specify the upper left element you would write (in Latex)
\Sigma_{11}.
No superscript (so no problem!)
HTH,
Eric
On Wed, Dec 9,
They let you guys go to the pup again? :-)-O
el
On 09/12/2020 10:06, Rolf Turner wrote:
[...]
> Is there any way to achieve, with plotmath, an effect like unto that
> produced by the LaTeX expression $\sigma^2_{11}$? Or should I just
> give up and go to the pub? :-)
[...]
--
Dr. Eberhard W. Lis
I would like to produce, as graphical annotation, the Greek letter sigma
with a superscript of 2 and a subcript of 11. (I.e. the top left hand
entry of a covariance matrix.)
I've tried:
plot(1:10,main=expression({sigma^2}[11]))
(and variants). This "sort of" works but there is an undesirable
Hi,
I'm trying to do text corpus processing on some novels, with koRpus
package and Tree Tagger. The script lists all txt files (11 in all) in a
dir, and processes it one by one.
##
rm(list=ls())
library(koRpus)
library(koRpus.lang.en)
set.kRp.env(TT.cmd = "/pathto/tree-tagger-english
t;
>
>
>
>
>
>
> *From:* Maram SAlem [mailto:marammagdysa...@gmail.com]
> *Sent:* giovedì 1 ottobre 2015 14:12
>
> *To:* Giorgio Garziano
> *Cc:* r-help@r-project.org
> *Subject:* Re: [R] (subscript) logical subscript too long
>
>
>
> Thanks a lot Giorg
Intel i5 Windows-7 64-bit 16GB RAM.
GG
From: Maram SAlem [mailto:marammagdysa...@gmail.com]
Sent: giovedì 1 ottobre 2015 14:12
To: Giorgio Garziano
Cc: r-help@r-project.org
Subject: Re: [R] (subscript) logical subscript too long
Thanks a lot Giorgio, I used
memory.limit(size=4096)
but got
: Giorgio Garziano
Cc: r-help@r-project.org
Subject: Re: [R] (subscript) logical subscript too long
Thanks a lot Giorgio, I used
memory.limit(size=4096)
but got
don't be silly!: your machine has a 4Gb address limit
I'm working on my Ph.D. thesis and I have a huge code of which this
memory.limit(size=4096)
>
>
>
>
>
>
>
> *From:* Maram SAlem [mailto:marammagdysa...@gmail.com]
> *Sent:* giovedì 1 ottobre 2015 13:22
> *To:* Giorgio Garziano
> *Cc:* r-help@r-project.org
> *Subject:* Re: [R] (subscript) logical subscript too long
>
>
>
Check your memory size by:
memory.limit()
try to increase it by:
memory.limit(size=4096)
From: Maram SAlem [mailto:marammagdysa...@gmail.com]
Sent: giovedì 1 ottobre 2015 13:22
To: Giorgio Garziano
Cc: r-help@r-project.org
Subject: Re: [R] (subscript) logical subscript too long
Thanks
Thanks Giorgio, I got it.
I managed to reach the matrix s whose rows represent all the possible
combinations. Here is the code:
> n=12
> m=7
> D<-matrix(0,nrow=n-m+1,ncol=m-1)
> for (i in 1:m-1)
+ {
+ D[,i]<-seq(0,n-m,1)
+ }
> ED <- do.call(`expand.grid`,as.data.frame(D))
> ED<-as.matrix(ED)
Be:
log <- (rowSums(ED) <= (n - m))
Compare the following two values:
length(log)
nrow(w)
--
GG
[[alternative HTML version deleted]]
__
R-help@r-project.org mailing list -- To UNSUBSCRIBE and more, see
https://stat.ethz.ch/ma
Dear All,
I'm trying to write a function in the values of some numeric vectors
(d1,d2,...,d(m-1)). This function should be applied on some combinations
of the elements of the (m-1) d vectors that satisfy the condition of having
a sum less than or equal to (n-m). I've tried the following code, but
I hope this toy example gives an idea to understand the problems that
you are facing now. Please see the below:
# 1. Create an empty list
> A <- list()
> A
list()
# 2. Add the first component (vector with two elements).
> A[[1]] <- c(2,6)
> A
[[1]]
[1] 2 6
# 3. Now, add the third component
Hello,
kindly ,
how to catch this Error
Error in A[[i]] : subscript out of bounds
and check that the list is empty is.null( A[[i]] ) do no twork
thanks in advance
R.I
[[alternative HTML version deleted]]
__
Here is the error am getting
Error: chunk 1
Error in tt[[ll[v]]] : subscript out of bounds
Error in rle(filenames) : 'x' must be an atomic vector
Calls: -> -> RweaveTryStop
Execution halted
On Wed, Nov 27, 2013 at 9:25 AM, Keniajin Wambui wrote:
> Dear Jeff;
> Below is the output for session
Dear Jeff;
Below is the output for sessioninfo()
R version 3.0.2 (2013-09-25)
Platform: x86_64-w64-mingw32/x64 (64-bit)
locale:
[1] LC_COLLATE=English_United Kingdom.1252 LC_CTYPE=English_United
Kingdom.1252
[3] LC_MONETARY=English_United Kingdom.1252 LC_NUMERIC=C
[5] LC_TIME=English_United King
This is the kind of question where including the output of sessionInfo() is a
really good idea.
This would, for example, answer the question of whether you are in fact using
the x64 version of R.
---
Jeff Newmiller
I am using R3.0.2 on a windows 64 bit machine. I building a .rnw file
from an .r file. I am using MikTex as the engine for latex. The
function dtaStata <- read.dta("core2.dta", convert.dates=TRUE) works
well in .R but; When I try reading a dta (stata) file I get an error
"subscript out of bounds".
use 'match' to convert the names to column indices and then use that for
indexing
indx <- match(subCols, names(yourMatrix)
mySubset <- yourMatrix[, indx]
Sent from my iPad
On Jul 5, 2013, at 2:22, Chirag Gupta wrote:
> Hi All
>
> I have a huge matrix m (10276 X 10276) dimension with same col
Hi All
I have a huge matrix m (10276 X 10276) dimension with same column name and
row names. (its a gene correlation matrix). I have another text file which
has 2700 names, basically locus ID of genes, which are also
rownames/colnames in m. Now I want to select all those columns from m whose
names
Hi all,
I've written a function for a simulation which will - in general operation
without being specific to the simulation scenario, duplicate or delete columns
from a matrix based on two values which determine how many as a proportion of
the matrix: the two values are always between 0.01 and
Thanks to you both. Calling recover (an option hitherto unknown to me) helped
me identify the problem.
For the record, the error occurred in the geom_path() line, not the list
concatenation, as I had previously thought. It was a logic problem: when
typeof == NULL the function jumped, but i remaine
You should have the following statement as part of your startup for R:
options(error=utils::recover)
When an error occurs, you will be at the stack frame where is happens
and you can examine the values of the variables that you are using and
this should help a lot in tracking down your problem.
On 2012-04-04 14:25, z2.0 wrote:
json_dir is a list of JSON lists mapping lat/long route points between
locations using CloudMade's API.
post_url is the URL of the HTTP request
for (n in json_dir) {
i = i + 1
if (typeof(json_dir[[i]]) != "NULL") {
if
json_dir is a list of JSON lists mapping lat/long route points between
locations using CloudMade's API.
post_url is the URL of the HTTP request
for (n in json_dir) {
i = i + 1
if (typeof(json_dir[[i]]) != "NULL") {
if (i == 1) {
dat_add
Hi
apply probably does not understand you function. I do not want to go too
deeply into it but I noticed few issues in it. See inline
>
> Dear ALL
> I have this function in R:
>
>
>
> func_LN <- function(data){
>
> med_ge <- matrix(c(rep(NA,nrow(data)*ncol(data))), nrow = nrow(data),
> ncol
On Fri, Feb 17, 2012 at 12:44:44PM +0100, Soheila Khodakarim wrote:
> Dear ALL
> I have this function in R:
>
>
>
> func_LN <- function(data){
>
> med_ge <- matrix(c(rep(NA,nrow(data)*ncol(data))), nrow = nrow(data),
> ncol=ncol(data), byrow=TRUE)
> T <- matrix(c(rep(NA,length(n)*ncol(data))),
Dear ALL
I have this function in R:
func_LN <- function(data){
med_ge <- matrix(c(rep(NA,nrow(data)*ncol(data))), nrow = nrow(data),
ncol=ncol(data), byrow=TRUE)
T <- matrix(c(rep(NA,length(n)*ncol(data))), nrow = length(n),
ncol=ncol(data), byrow=TRUE)
Tdiff<- matrix(c(rep(NA,length(n)*ncol(da
David Winsemius wrote
>
> The insight that
> allowed me to get a significantly higher frequency of success was
> realizing that the correct separators between separate expressions
> were "*" and "~" rather than or . Inside an expression
> a comma will signal a new expression element. A
On 12-01-04 11:41 AM, suse wrote:
Thank you! It works now.
But I still don't understand, how all these expressions, "", paste, group,
eval... have to be used together. (For example, I first tried
expression(sm[w,grass]) but it didn't work, and I couldn't find, why (and
when) commas are interpret
Thank you! It works now.
But I still don't understand, how all these expressions, "", paste, group,
eval... have to be used together. (For example, I first tried
expression(sm[w,grass]) but it didn't work, and I couldn't find, why (and
when) commas are interpreted here differently). So: Is there
> -Original Message-
> From: r-help-boun...@r-project.org [mailto:r-help-bounces@r-
> project.org] On Behalf Of David Winsemius
> Sent: Wednesday, January 04, 2012 9:53 AM
> To: Uwe Ligges
> Cc: r-help@r-project.org; suse
> Subject: Re: [R] subscript with comma
>
On Jan 4, 2012, at 10:51 AM, Uwe Ligges wrote:
On 04.01.2012 16:12, suse wrote:
Hi,
I want to write a word with subscript in a graph. Unfortunately, the
subscript contains a comma, so all my trials didn't work and I
didn't find
how to do it.
I want to write "sm" as normal text and "w,gra
On 04.01.2012 16:12, suse wrote:
Hi,
I want to write a word with subscript in a graph. Unfortunately, the
subscript contains a comma, so all my trials didn't work and I didn't find
how to do it.
I want to write "sm" as normal text and "w,grass" in the subscript. Can
anybody help me?
And a mor
Hi,
I want to write a word with subscript in a graph. Unfortunately, the
subscript contains a comma, so all my trials didn't work and I didn't find
how to do it.
I want to write "sm" as normal text and "w,grass" in the subscript. Can
anybody help me?
And a more general question: I read the help t
You need to at least provide 'str(datos2)' so we can understand your
data. You are trying to access a row with the name "2011-01-03"; does
that row exist in your data? what does rownames(datos2) show? The
guide says "PLEASE do read the posting guide
http://www.R-project.org/posting-guide.html
and
Hi R users:
I got a problem traying to select one date of a timeSeries object.
But it works with the SWX data objetct.
What am I doing worng?
library(fImport)
datos2<-readSeries(file="misDatos.csv",header=TRUE,sep=",",
format="%Y-%m-%d",
FinCenter='America
I am having trouble outputting a presence/absence heatmap using the following R
script:
source("http://faculty.ucr.edu/~tgirke/Documents/R_BioCond/My_R_Scripts/overLapper.R";)
I can generate the heatmap graphic. I just can't sort my columns without
getting an error.
The instructions I'm follow
Great! I got it. Thanks a bunch.
On Thu, Apr 28, 2011 at 4:02 PM, Duncan Murdoch wrote:
> On 28/04/2011 3:49 PM, Dat Mai wrote:
>
>> I currently have this code:
>>
>> for(j in 2:n){
>> for(i in 1:(j-1)){
>>
>> # Make sure the inputs are for the matrix "m"
>> input1=rownames(m)[i]
>>
On 28/04/2011 3:49 PM, Dat Mai wrote:
I currently have this code:
for(j in 2:n){
for(i in 1:(j-1)){
# Make sure the inputs are for the matrix "m"
input1=rownames(m)[i]
input2=colnames(m)[j]
q=t[(t$Rec1==input1& t$Rec2==input2),output]
if(length(q)==0){
q=t[
I currently have this code:
for(j in 2:n){
for(i in 1:(j-1)){
# Make sure the inputs are for the matrix "m"
input1=rownames(m)[i]
input2=colnames(m)[j]
q=t[(t$Rec1==input1 & t$Rec2==input2),output]
if(length(q)==0){
q=t[(t$Rec1==input2 & t$Rec2==input1),output]
}
On Mar 5, 2011, at 7:41 AM, Stat Consult wrote:
On Sat, Mar 5, 2011 at 4:08 PM, Stat Consult
wrote:
Dear ALL
I cannot run this line
stat.obs <- apply (GS, 2, function(z) Hott2(t(DATA[which(z==1),]),
cl))
Error in Hott2 (t(DATA[which(z == 1), ]), cl) : subscript out of
bounds
I wil
Dear ALL
I cannot run this line
stat.obs <- apply (GS, 2, function(z) Hott2(t(DATA[which(z==1),]), cl))
Error in Hott2 (t(DATA[which(z == 1), ]), cl) : subscript out of bounds
I will be glade if you guide me.
***
*GS
On Sat, Mar 5, 2011 at 4:08 PM, Stat Consult wrote:
> Dear ALL
>
> I cannot run this line
>
> stat.obs <- apply (GS, 2, function(z) Hott2(t(DATA[which(z==1),]), cl))
>
> Error in Hott2 (t(DATA[which(z == 1), ]), cl) : subscript out of bounds
>
> I will be glade if you guide me.
>
>
> *
On 11/24/2009 10:00 AM, tobiasfa wrote:
Hi!
Trying to make a forecast, and get the following error message:
Error in NextMethod("[<-") : subscript out of bounds
The script is as follows:
Forecast.A<- ts(matrix(NA, nrow=25, ncol = 1,
+ dimnames = list(c(), c("Outcome"))),
+ start = c(2006,
Hi!
Trying to make a forecast, and get the following error message:
Error in NextMethod("[<-") : subscript out of bounds
The script is as follows:
> Forecast.A <- ts(matrix(NA, nrow=25, ncol = 1,
+ dimnames = list(c(), c("Outcome"))),
+ start = c(2006, 10), frequency = 12)
> for (i in 1:25) {
Try this:
x[1,, drop = FALSE]
On Tue, Jul 21, 2009 at 1:46 PM, Vadim Ogranovich <
vogranov...@jumptrading.com> wrote:
> Dear R-help,
>
> When the result of a matrix subscription degenerates to a scalar the names
> implied by the dimnames are discarded.
>
> > x <- matrix(0, 1, 1, dimnames=list('
Dear R-help,
When the result of a matrix subscription degenerates to a scalar the names
implied by the dimnames are discarded.
> x <- matrix(0, 1, 1, dimnames=list('a', 'x'))
## below I expected result to have names='x', it's not
> x[1,]
[1] 0
## below I expected result to have names='a', it's
Consider ->
if (BinNumber==1)
Loc_Prob=Bin1Main.data[findInterval(Dev_Size,Bin1Main.data[,1])+1,2]
.
..
...
if (BinNumber==10)
Loc_Prob=Bin10Main.data[findInterval(Dev_Size,Bin10Main.data[,1])+1,2]
BinNumber is just referencing 1 of 10 sets of data so:
where BinNumber = 1 and Dev_S
Dear R users,
I have the following problem. Suppose I have the following toy data set:
> data
m1 m2 m3 m4 m5 state
[1,] 1 0 1 13 23 2
[2,] 0 1 0 23 94 2
[3,] 1 0 0 45 56 1
[4,] 0 1 0 35 84 2
[5,] 1 1 0 98 37 1
[6,] 1 1 0 68 1 2
where the
try something like this:
plot(0:1, 0:1, type = "n")
text(0.5, 0.5, expression(paste(plain(log)[2], " intensity")))
and check ?plotmath for more info.
I hope it helps.
Best,
Dimitris
Timthy Chang wrote:
A similar question:
mtext(text="log2 intensity ")
How can I change "2" to be subscript?
Try this:
mtext(text=bquote(log[2]~intensity))
On Wed, Jan 7, 2009 at 5:36 AM, Timthy Chang wrote:
>
> A similar question:
>
> mtext(text="log2 intensity ")
> How can I change "2" to be subscript? (see picture below)
>
>
> http://www.nabble.com/file/p21326192/log2_intensity.jpg
> --
> View this
A similar question:
mtext(text="log2 intensity ")
How can I change "2" to be subscript? (see picture below)
http://www.nabble.com/file/p21326192/log2_intensity.jpg
--
View this message in context:
http://www.nabble.com/Subscript-tp12241351p21326192.html
Sent from the R help mailing list arc
I'm working on Human Exon Array 1.0 ST. I'm getting normalized data
fine but I'm running into problems with QC. QCReport gives me the
following error:
> load(file= "huex10stv2cdf.rda")
> [EMAIL PROTECTED] <- "huex10stv2cdf"
> QCReport(exon.data, file = "QCReport.pdf")
Error in as.vector(an
(mean.std.s2n.loss.gain[[1]])
Probe.Set.ID rho_prime rho_prime_sd pom Expr1 matchinggenes
Meanstd_dev
29 SNP_A-190846347 2.47 0.75 0 PRKCZ
-0.345616170.13443676
30 SNP_A-213137044 2.61 0.58 0
(mean.std.s2n.loss.gain[[1]])
Probe.Set.ID rho_prime r ho_prime_sdpom Expr1
matchinggenes Mean std_dev
29 SNP_A-190846347 2.47 0.75 0 PRKCZ -
0.34560. 1344 30 SNP_A-213137044 2.61
59 matches
Mail list logo