externalVector-class {externalVector} | R Documentation |
Class "externalVector", base class for vector objects stored in
an external resource
Description
This class represents objects that behave like R basic
vectors but are stored in some external resource.
Objects from the Class
A virtual Class: No objects may be created from it.
Methods
Common signature components for the methods:
x | The class "externalVector" |
X | The class "externalVector" |
Description of the methods:
- asEach(x, type, arrayOnly)
- Coerce
x
so that it now
behaves like a basic R vector with the same class as type
.
- c(x, ..., recursive)
- Combine all the arguments into a
single vector. Behaves like a basic R vector with the same class as
type
.
- as.Rvector(x)
- Coerce
x
to a basic R vector with same
names, dimension and dimnames (if any of these are present in
x
).
- as.vector(x, mode)
- Return an external vector which behaves
like a basic R vector of mode
mode
.
- as.logical(x, ...)
- Return an external vector with all
elements coerced to logical.
- as.integer(x, ...)
- Return an external vector with all
elements coerced to integer.
- as.double(x, ...)
- Return an external vector with all
elements coerced to numeric.
- as.numeric(x, ...)
- Return an external vector with all
elements coerced to numeric.
- as.charcater(x)
- Return an external vector with all
elements coerced to character.
- as.list(x, ...)
- Return an external vector that behaves like
a list.
- as.single(x, ...)
- Return an external vector with all
elements coerced to numeric and a "CSingle" attribute set to
TRUE
.
- as.data.frame(x, row.names, optional)
- Create a data.frame
object from
x
.
- as.matrix(x)
- If
length(dim(x))
is 2
, return
x
unchanged. Otherwise, return x
as a matrix with a
single column.
- defaultElement(x)
- The default element of
x
contained
in a basic R vector.
- dimnames(x) <- value
- Set dimnames of
x
to value.
- names(x) <- value
- Set names of
x
to value.
- show(object)
- Display
object
.
- apply(X, MARGIN, FUN, ...)
- Coerce X to an R matrix and call
the default
apply
method.
- lapply(X, FUN, ...)
- Lapply for "externalVector"
class.
- sapply(X, FUN, ..., simplify, USE.NAMES)
- Sapply for
"externalVector" class.
- mean(x, trim = 0, na.rm = FALSE, ...)
- Mean and trimmed
mean of
x
.
- median(x, na.rm = FALSE)
- Mean of
x
.
Virtual Methods
Common signature components for implementation of the virtual methods:
x | A subclass of "externalVector" |
value | The class "ANY" |
Description of the virtual methods:
- setDimNames(x, value)
- Set the dimnames of
x
to
value
without any error checking or coercion. Return the
modified x
.
- setNames(x, value)
- Set the names of
x
to value
without any error checking or coercion. Return the modified
x
.
See Also
externalVectorWithStorage-class
,matrixIndex-class
,
indirectExternalVector-class
,
indirectExternalMatrix-class
, for subclasses of
"externalVector"
.
[Package
externalVector version 1.10.0
Index]