Displaying 20 results from an estimated 108 matches for "noquot".
Did you mean:
noquota
1997 Aug 20
1
R-alpha: R-0.50-a3(+) Method despatching bug ?
It is very wierd... Can some of you confirm the following behavior ?
It is a new bug (feature ?) which was not yet in 0.49 ...
noquote <- function(obj) {
## constructor for a useful "minor" class
if(!inherits(obj,"noquote")) class(obj) <- c(class(obj),"noquote")
obj
}
"[.noquote" <- function (x, subs) structure(unclass(x)[subs], class = "noquote")
print.noquote <-...
2020 Nov 05
1
Named class vector
The source to the noquote() function looks like this:
noquote <- function(obj, right = FALSE) {
## constructor for a useful "minor" class
if(!inherits(obj,"noquote"))
class(obj) <- c(attr(obj, "class"),
if(right) c(right = "noquote")...
2008 Jun 15
1
c.noquote() weirdness
I haven't been able to get anywhere tracking this down. It seems that c.noquote() does
something strange with its third (and subsequent) parameters:
R-2.7.0 under NetBSD, R-2.6.0 under Solaris, and R-2.8.0 (unstable) (2008-06-10 r45893)
under WinXP, I get:
> c(noquote('z'), 'y', 'x', '*')
[1] z y x * x *
>
or:
> c(noquote('z&...
2002 Jun 02
2
selections using text strings (result of noquote)
G'day all,
I am trying to use a string as an argument in a selection but things are
not working as I expect, seems the selection is not seeing the expanded
string and I do not know how to make it. Perhaps the noquote class value
that is returned is the problem.
Here is an example.
> selection #this is my string
[1] "attackprogress$Se=='Toona ciliata [19825: JMM35]'"
> noquote(selection) #if I do this I get a string that if I paste into
[] works fine
[1] attackprogress$Se=='Toona c...
2011 Jan 24
2
normality and equal variance testing
...teins = ncol(dataSet)
nameProteins = colnames(dataSet)
for (i in 3:numProteins) {
fla = as.formula(paste(nameProteins[i],"~","Trt*Dose"))
mod = lm(fla, data = dataSet , contrasts = list(Trt = contr.sum, Dose =
contr.sum))
ano = Anova(mod, type = "III")
print.noquote("")
print.noquote("")
print.noquote("--------------------------------------------")
print.noquote(paste("--------- Analysis of Spot:
",nameProteins[i],"------------"))
print.noquote("--------------------------------------------")...
2011 Mar 30
1
Class noquote to matrix
Hi,
I apologize if the solution is right in front of me, but I can't find anything on how to convert a class of 'noquote' to 'matrix'. I've tried as.matrix and I've tried coercing it by 'class(x)<-matrix', but of course that didn't work. I've been using the function 'symnum' which returns an object of class 'noquote'.
Here is an example from the 'symnum'...
2010 May 08
3
Count cases in a list
...to count how many times names in list L,
nombreL, apear in list C, nombreC.
Can I improve the next program?
cuenta <- 0
topL <- length(nombreL)
topC <- length(nombreC)
for (i in 1:topL) {
for (j in 1:topC) {
k <-
grep(noquote(nombreL[i]),nombreC[j])
if (length(k) > 0){
cuenta <- cuenta + 1
}
}
?Is there a way to vectorizad?
Thanks,
Sebasti?n.
Saludos,
Sebasti?n.
2009 Aug 11
1
Passing a list object to lapply
...4)), sep = "")), function(x) mdy.date(x[1, 2], x[1, 1], x[1,
3]))
1: unlist(lapply(list(paste("T", substr(names(TRACKDATA)[d], 1,
(nchar(names(TRACKDATA)[d]) - 4)), sep = "")), function(x)
mdy.date(x[1,
2], x[1, 1], x[1, 3])))
#Fails (trying noquote).
min(unlist(lapply(list(noquote(paste("T",substr(names(TRACKDATA)[d],1,(n
char(names(TRACKDATA)[d])-4)),sep=""))), function(x) mdy.date(x[1, 2],
x[1, 1], x[1, 3]))))
Error in unclass(x)[...] : incorrect number of dimensions
> traceback()
6: `[.noquote`(x, 1, 2)
5: x[1, 2]
4...
2009 Apr 07
3
write text file as output without quotes
...When I use the below to write the text file
try=data.frame(rep("a",5), rep("b",5))
write.table(try,"z:\\try.txt",row.names=F,col.names=F,sep="\t")
the output contains two columns with quotes! Is there a way to write
without quotes?
I tried
try[,1]=noquote(try[,1])
try[,2]=noquote(try[,2])
Thank you,
Regards,
Ravi Shankar
This e-mail may contain confidential and/or privileged i...{{dropped:13}}
1997 Aug 15
1
R-alpha: (minor?) S-R inconsistency: NULL =~= list() -- useful is.ALL function
...Author: Martin Maechler, Date: 13 Dec 96, 16:28
if(!is.logical(log.v)) {
warning("coercing argument 'log.v' to logical")
log.v <- as.logical(log.v)
}
structure(if(length(log.v) == 0) "()" else c(".","|")[ 1+ log.v],
class = "noquote")
}
## The constructor function
noquote <- function(obj) {
if(!inherits(obj,"noquote"))
class(obj) <- c(class(obj),"noquote")
obj
}
##-- this is just like 'expression'
"[.noquote" <- function (x, subs) structure(unclass(x)[subs], class...
2009 Dec 09
4
binary string conversion to a vector (PR#14120)
...inary vector ...
# but does it?? Why do we get a vector with quoted binary values??
{
qlist = strsplit(string, sep)
qvector = qlist[[1]]
cat("\n string=", string)
cat("\n qvector=", qvector)
n = length(qvector) ; xvector = NULL
for (i in 1:n) {
tmp = noquote(qvector[i])
cat("\n", i,", tmp=", tmp)
xvector = c(xvector, tmp)
cat("\n", i,", xvector=", xvector)
}
cat("\n")
return(xvector)
}
> print(binS2binV("10101100"))
string= 10101100
qvector= 1 0 1 0 1 1 0 0
1 ,...
2017 Sep 19
2
remove quotes from matrix
Hi Duncan and Bert;
I do appreciate for your replies. I just figured out that after x1=
noquotes(x) commend my 733*22 matrix returns into n*1 vector. Is there way
to keep this as matrix with the dimension of 733*22?
Regards,
Greg
On Tue, Sep 19, 2017 at 10:04 AM, Duncan Murdoch <murdoch.duncan at gmail.com>
wrote:
> On 19/09/2017 9:47 AM, greg holly wrote:
>
>> Hi all;...
2012 Sep 17
4
Using paste to create and evaluate a variable expression
Is it possible to use "paste" to write out an expression and evaluate it?
Suppose I want to add two vectors X1 and X2, defined as follows:
X1 <- 1:6
X2 <- 6:1
If I write the following it looks like what I want but is a character:
noquote(paste(paste("X", 1, sep = ""), paste("X", 2, sep = ""), sep = "+"))
Is there a way to tell R that I want to evaluate the text, not just print
it out as a character?
Bryan
[[alternative HTML version deleted]]
2023 May 02
1
'error=No space left on device' but, there is plenty of space all nodes
...:/lvbackups/brick
TCP Port : 60039
RDMA Port : 0
Online : Y
Pid : 1664
File System : xfs
Device : /dev/mapper/vgbackups-lvbackups
Mount Options :
rw,relatime,attr2,inode64,logbufs=8,logbsize=32k,sunit=512,swidth=512,noquot
a
Inode Size : 512
Disk Space Free : 6.1TB
Total Disk Space : 29.0TB
Inode Count : 3108974976
Free Inodes : 3108881513
----------------------------------------------------------------------------
--
Brick : Brick nybaknode11.example.net:/lvbackups...
2009 Mar 23
2
Looping of read.table and assignment
...\table_",year,".txt", sep="")
filelist
# Code seems to operate successfully up to this point
for (i in filelist) {
for (iyear in 1951:2000) {
assign(paste("table_",iyear, sep=""),read.table(file=i, header=TRUE, sep=","))
noquote(paste("LOADED FILE:",paste("table_",iyear, sep=""),sep=" "))
}
}
Can anyone see what I've done wrong here?
And just as an aside, as you can see, I've inserted the 'noquote' line so that when the co...
2017 Oct 13
1
Quotation marks hinder for loop
..._var){
assign(paste("V", i, sep=""), paste("V", i, sep="")[,-1])
}
Error in paste("V", i, sep = "")[, -1] : incorrect number of dimensions
I suppose that it might be important to call object names without quotation
mark, so
I tried the noquote function, but it did not change the situation.
1)
> for (i in 1:N_var){
+ assign(colnames(noquote(paste("V", i, sep=""))[2], par$V2[i]))
+ }
Error in if (do.NULL) NULL else if (nc > 0L) paste0(prefix, seq_len(nc))
else character() :
argument is not interpretable as l...
2023 May 04
1
'error=No space left on device' but, there is plenty of space all nodes
...net:/lvbackups/brick
TCP Port? ? ? ? ? ? : 60039
RDMA Port? ? ? ? ? ? : 0
Online? ? ? ? ? ? ? : Y
Pid? ? ? ? ? ? ? ? ? : 1664
File System? ? ? ? ? : xfs
Device? ? ? ? ? ? ? : /dev/mapper/vgbackups-lvbackups
Mount Options? ? ? ? :
rw,relatime,attr2,inode64,logbufs=8,logbsize=32k,sunit=512,swidth=512,noquot
a
Inode Size? ? ? ? ? : 512
Disk Space Free? ? ? : 6.1TB
Total Disk Space? ? : 29.0TB
Inode Count? ? ? ? ? : 3108974976
Free Inodes? ? ? ? ? : 3108881513
----------------------------------------------------------------------------
--
Brick? ? ? ? ? ? ? ? : Brick nybaknode11.example.net:/lvbackups/b...
2013 Jul 02
2
Recoding variables based on reference values in data frame
...,2])
Kgeno[,2] <- ifelse(Kgeno[,2] == "_", "NA", Kgeno[,2])
#convert genotype strings in the first data column to numeric values #(two
major alleles=0, 1 minor and 1 major=1, 2 minor alleles=2), else #leave as
is (to preserve NA values).
Kgeno[,2] <-
ifelse(Kgeno[,2] == noquote(paste(as.character(Kgeno[1,2]), as.character(
Kgeno[1,2]), sep=""), 0,
ifelse(Kgeno[,2] == noquote(paste(as.character(Kgeno[1,2]), as.character(
Kgeno[2,2]), sep=""), 1,
ifelse(Kgeno[,2] == noquote(paste(as.character(Kgeno[2,2]), as.character(
Kgeno[2,2]), sep=""),...
2013 Mar 07
1
Error: no 'dimnames' attribute for array
Dear XpeRts,
I prepared a no qoute Character string by the following command
s<-noquote(paste (b1, collapse=","))
where, b1 is the vector of 24 intergers.
> dput(b1)
c(1L, 2L, 6L, 7L, 12L, 16L, 17L, 20L, 21L, 23L, 25L, 34L, 46L, 48L, 58L, 64L, 65L, 68L, 82L, 97L, 98L, 101L, 113L, 115L)
> dput(s)
structure("1,2,6,7,12,16,17,20,21,23,25,34,46,48,58,64,65,68,8...
2008 Oct 18
5
Getting names of variables without quotes
Dear R-helpers,
hello
I am seeking your help in somehow getting names of variables without quotes (" ").
Let us say, we have a table with 3 variables V1, V2 and V3. After the table is read, I get names of the variables (thro' the following code) as under quotes (like "V1" rather than the original representation V1)