noquote(obj) print.noquote(obj, ...) obj[j]
obj
|
any R object; typically a vector of character
strings.
|
...
|
further options for print.
|
class and object orientation.noquote returns its argument as an object of class
"noquote". The function "[.noquote" ensures that the
class is not lost by subsetting.
For (default) printing, print.noquote will be used which prints
characters without quotes ("...").
methods,class,print.
letters
nql <- noquote(letters)
nql
nql[1:4] <- "oh"
nql[1:12]
cmp.logical <- function(log.v)
{
## Purpose: compact printing of logicals
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")
}
cmp.logical(runif(20) > 0.8)