-
Notifications
You must be signed in to change notification settings - Fork 1k
/
Copy pathsetkey.R
361 lines (336 loc) · 19.3 KB
/
setkey.R
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
37
38
39
40
41
42
43
44
45
46
47
48
49
50
51
52
53
54
55
56
57
58
59
60
61
62
63
64
65
66
67
68
69
70
71
72
73
74
75
76
77
78
79
80
81
82
83
84
85
86
87
88
89
90
91
92
93
94
95
96
97
98
99
100
101
102
103
104
105
106
107
108
109
110
111
112
113
114
115
116
117
118
119
120
121
122
123
124
125
126
127
128
129
130
131
132
133
134
135
136
137
138
139
140
141
142
143
144
145
146
147
148
149
150
151
152
153
154
155
156
157
158
159
160
161
162
163
164
165
166
167
168
169
170
171
172
173
174
175
176
177
178
179
180
181
182
183
184
185
186
187
188
189
190
191
192
193
194
195
196
197
198
199
200
201
202
203
204
205
206
207
208
209
210
211
212
213
214
215
216
217
218
219
220
221
222
223
224
225
226
227
228
229
230
231
232
233
234
235
236
237
238
239
240
241
242
243
244
245
246
247
248
249
250
251
252
253
254
255
256
257
258
259
260
261
262
263
264
265
266
267
268
269
270
271
272
273
274
275
276
277
278
279
280
281
282
283
284
285
286
287
288
289
290
291
292
293
294
295
296
297
298
299
300
301
302
303
304
305
306
307
308
309
310
311
312
313
314
315
316
317
318
319
320
321
322
323
324
325
326
327
328
329
330
331
332
333
334
335
336
337
338
339
340
341
342
343
344
345
346
347
348
349
350
351
352
353
354
355
356
357
358
359
360
361
setkey <- function(x, ..., verbose=getOption("datatable.verbose"), physical=TRUE)
{
if (is.character(x)) stop("x may no longer be the character name of the data.table. The possibility was undocumented and has been removed.")
cols = as.character(substitute(list(...))[-1])
if (!length(cols)) cols=colnames(x)
else if (identical(cols,"NULL")) cols=NULL
setkeyv(x, cols, verbose=verbose, physical=physical)
}
# FR #1442
setindex <- function(...) setkey(..., physical=FALSE)
setindexv <- function(...) setkeyv(..., physical=FALSE)
set2key <- function(...) {
warning("set2key() will be deprecated in the next relase. Please use setindex() instead.", call.=FALSE)
setkey(..., physical=FALSE)
}
set2keyv <- function(...) {
warning("set2key() will be deprecated in the next relase. Please use setindex() instead.", call.=FALSE)
setkeyv(..., physical=FALSE)
}
setkeyv <- function(x, cols, verbose=getOption("datatable.verbose"), physical=TRUE)
{
if (is.null(cols)) { # this is done on a data.frame when !cedta at top of [.data.table
if (physical) setattr(x,"sorted",NULL)
setattr(x,"index",NULL) # setkey(DT,NULL) also clears secondary keys. set2key(DT,NULL) just clears secondary keys.
return(invisible(x))
}
if (!is.data.table(x)) stop("x is not a data.table")
if (!is.character(cols)) stop("cols is not a character vector. Please see further information in ?setkey.")
if (physical && identical(attr(x,".data.table.locked"),TRUE)) stop("Setting a physical key on .SD is reserved for possible future use; to modify the original data's order by group. Try set2key instead. Or, set*(copy(.SD)) as a (slow) last resort.")
if (!length(cols)) {
warning("cols is a character vector of zero length. Removed the key, but use NULL instead, or wrap with suppressWarnings() to avoid this warning.")
setattr(x,"sorted",NULL)
return(invisible(x))
}
if (identical(cols,"")) stop("cols is the empty string. Use NULL to remove the key.")
if (any(nchar(cols)==0)) stop("cols contains some blanks.")
if (!length(cols)) {
cols = colnames(x) # All columns in the data.table, usually a few when used in this form
} else {
# remove backticks from cols
cols <- gsub("`", "", cols)
miss = !(cols %in% colnames(x))
if (any(miss)) stop("some columns are not in the data.table: " %+% cols[miss])
}
alreadykeyedbythiskey = identical(key(x),cols)
if (".xi" %chin% names(x)) stop("x contains a column called '.xi'. Conflicts with internal use by data.table.")
for (i in cols) {
.xi = x[[i]] # [[ is copy on write, otherwise checking type would be copying each column
if (!typeof(.xi) %chin% c("integer","logical","character","double")) stop("Column '",i,"' is type '",typeof(.xi),"' which is not supported as a key column type, currently.")
}
if (!is.character(cols) || length(cols)<1) stop("'cols' should be character at this point in setkey")
if (verbose) {
tt = system.time(o <- forderv(x, cols, sort=TRUE, retGrp=FALSE)) # system.time does a gc, so we don't want this always on, until refcnt is on by default in R
cat("forder took", tt["user.self"]+tt["sys.self"], "sec\n")
} else {
o <- forderv(x, cols, sort=TRUE, retGrp=FALSE)
}
if (!physical) {
if (is.null(attr(x,"index",exact=TRUE))) setattr(x, "index", integer())
setattr(attr(x,"index",exact=TRUE), paste("__",paste(cols,collapse="__"),sep=""), o)
return(invisible(x))
}
setattr(x,"index",NULL) # TO DO: reorder existing indexes likely faster than rebuilding again. Allow optionally. Simpler for now to clear.
if (length(o)) {
if (alreadykeyedbythiskey) warning("Already keyed by this key but had invalid row order, key rebuilt. If you didn't go under the hood please let datatable-help know so the root cause can be fixed.")
if (verbose) {
tt = system.time(.Call(Creorder,x,o))
cat("reorder took", tt["user.self"]+tt["sys.self"], "sec\n")
} else {
.Call(Creorder,x,o)
}
} else {
if (verbose) cat("x is already ordered by these columns, no need to call reorder\n")
} # else empty integer() from forderv means x is already ordered by those cols, nothing to do.
if (!alreadykeyedbythiskey) setattr(x,"sorted",cols) # the if() just to save plonking an identical vector into the attribute
invisible(x)
}
key <- function(x) attr(x,"sorted",exact=TRUE)
key2 <- function(x) {
warning("key2() will be deprecated in the next relase. Please use indices() instead.", call.=FALSE)
ans = names(attributes(attr(x,"index",exact=TRUE)))
if (is.null(ans)) return(ans) # otherwise character() gets returned by next line
gsub("^__","",ans)
}
indices <- function(x) {
ans = names(attributes(attr(x,"index",exact=TRUE)))
if (is.null(ans)) return(ans) # otherwise character() gets returned by next line
gsub("^__","",ans)
}
get2key <- function(x, col) attr(attr(x,"index",exact=TRUE),paste("__",col,sep=""),exact=TRUE) # work in progress, not yet exported
"key<-" <- function(x,value) {
warning("The key(x)<-value form of setkey can copy the whole table. This is due to <- in R itself. Please change to setkeyv(x,value) or setkey(x,...) which do not copy and are faster. See help('setkey'). You can safely ignore this warning if it is inconvenient to change right now. Setting options(warn=2) turns this warning into an error, so you can then use traceback() to find and change your key<- calls.")
setkeyv(x,value)
# The returned value here from key<- is then copied by R before assigning to x, it seems. That's
# why we can't do anything about it without a change in R itself. If we return NULL (or invisible()) from this key<-
# method, the table gets set to NULL. So, although we call setkeyv(x,cols) here, and that doesn't copy, the
# returned value (x) then gets copied by R.
# So, solution is that caller has to call setkey or setkeyv directly themselves, to avoid <- dispatch and its copy.
}
haskey <- function(x) !is.null(key(x))
# reverse a vector by reference (no copy)
setrev <- function(x) .Call(Csetrev, x)
# reorder a vector based on 'order' (integer)
# to be used in fastorder instead of x[o], but in general, it's better to replace vector subsetting with this..?
# Basic checks that all items of order are in range 1:n with no NAs are now made inside Creorder.
# FOR INTERNAL USE ONLY
setreordervec <- function(x, order) .Call(Creorder, x, order)
# sort = sort.int = sort.list = order = is.unsorted <- function(...)
# stop("Should never be called by data.table internals. Use is.sorted() on vectors, or forder() for lists and vectors.")
# Nice idea, but users might use these in i or j e.g. blocking order caused tests 304 to fail.
# Maybe just a grep through *.R for use of these function internally would be better (TO DO).
# Don't use base::is.unsorted internally, because :
# 1) it returns NA if any(is.na(.)) where NAs are detected at R level, inefficiently
# 2) it uses locale whereas in data.table we control locale sorting independently (C locale currently, but
# "sorted" attribute will need an extra attribute "locale" so we can check if key's locale is the current locale)
# 3) wrapper needed, used to be :
# identical(FALSE,is.unsorted(x)) && !(length(x)==1 && is.na(x))
# where the && was needed to maintain backwards compatibility after r-devel's change of is.unsorted(NA) to FALSE (was NA) [May 2013].
# The others (order, sort.int etc) are turned off to protect ourselves from using them internally, for speed and for
# consistency; e.g., consistent twiddling of numeric/integer64, NA at the beginning of integer, locale ordering of character vectors.
is.sorted <- function(x, by=seq_along(x)) {
if (is.list(x)) {
warning("Use 'if (length(o<-forderv(DT,by))) ...' for efficiency in one step, so you have o as well if not sorted.")
# could pass through a flag for forderv to return early on first FALSE. But we don't need that internally
# since internally we always then need ordering, an it's better in one step. Don't want inefficiency to creep in.
# This is only here for user/debugging use to check/test valid keys; e.g. data.table:::is.sorted(DT,by)
0 == length(forderv(x,by,retGrp=FALSE,sort=TRUE))
} else {
if (!missing(by)) stop("x is vector but 'by' is supplied")
.Call(Cfsorted, x)
}
# Cfsorted could be named CfIsSorted, but since "sorted" is an adjective not verb, it's clear; e.g., Cfsort would sort it ("sort" is verb).
# Return value of TRUE/FALSE is relied on in [.data.table quite a bit on vectors. Simple. Stick with that (rather than -1/0/+1)
# Important to call forder.c::fsorted here, for consistent character ordering and numeric/integer64 twiddling.
}
forderv <- function(x, by=seq_along(x), retGrp=FALSE, sort=TRUE, order=1L, na.last=FALSE)
{
if (!(sort || retGrp)) stop("At least one of retGrp or sort must be TRUE")
na.last = as.logical(na.last)
if (!length(na.last)) stop('length(na.last) = 0')
if (length(na.last) != 1L) {
warning("length(na.last) > 1, only the first element will be used")
na.last = na.last[1L]
}
# TO DO: export and document forder
if (is.atomic(x)) {
if (!missing(by) && !is.null(by)) stop("x is a single vector, non-NULL 'by' doesn't make sense")
by = NULL
if ( !missing(order) && (length(order) != 1L || !(order %in% c(1L, -1L))) )
stop("x is a single vector, length(order) must be =1 and it's value should be 1 (ascending) or -1 (descending).")
} else {
if (!length(x)) return(integer(0)) # to be consistent with base::order. this'll make sure forderv(NULL) will result in error
# (as base does) but forderv(data.table(NULL)) and forderv(list()) will return integer(0))
if (is.character(by)) by=chmatch(by, names(x))
by = as.integer(by)
if ( (length(order) != 1L && length(order) != length(by)) || any(!order %in% c(1L, -1L)) )
stop("x is a list, length(order) must be either =1 or =length(by) and each value should be 1 or -1 for each column in 'by', corresponding to ascending or descending order, respectively. If length(order) == 1, it will be recycled to length(by).")
if (length(order) == 1L) order = rep(order, length(by))
}
order = as.integer(order)
.Call(Cforder, x, by, retGrp, sort, order, na.last) # returns integer() if already sorted, regardless of sort=TRUE|FALSE
}
forder <- function(x, ..., na.last=TRUE, decreasing=FALSE)
{
if (!is.data.table(x)) stop("x must be a data.table.")
if (ncol(x) == 0) stop("Attempting to order a 0-column data.table.")
if (is.na(decreasing) || !is.logical(decreasing)) stop("'decreasing' must be logical TRUE or FALSE")
cols = substitute(list(...))[-1]
if (identical(as.character(cols),"NULL") || !length(cols)) return(NULL) # to provide the same output as base::order
ans = x
order = rep(1L, length(cols))
if (length(cols)) {
ans = vector("list", length(cols))
cols = as.list(cols)
xcols = names(x)
for (i in seq_along(cols)) {
v=cols[[i]]
if (i == 1L && is.call(v) && length(v) == 2L && v[[1L]] == "list") return(1L) # to be consistent with base, see comment below under while loop
while (is.call(v) && length(v) == 2L && v[[1L]] != "list") {
# take care of "--x", "{-x}", "(---+x)" etc., cases and also "list(y)". 'list(y)' is ambiguous though. In base, with(DT, order(x, list(y))) will error
# that 'arguments are not of same lengths'. But with(DT, order(list(x), list(y))) will return 1L, which is very strange. On top of that, with(DT,
# order(x, as.list(10:1)) would return 'unimplemented type list'. It's all very inconsistent. But we HAVE to be consistent with base HERE.
if (!as.character(v[[1L]]) %chin% c("+", "-")) break # FIX for bug #5583
if (v[[1L]] == "-") order[i] = -order[i]
v = v[[-1L]]
}
if (is.name(v)) {
ix <- chmatch(as.character(v), xcols, nomatch=0L)
if (ix != 0L) ans <- point(ans, i, x, ix) # see 'point' in data.table.R and C-version pointWrapper in assign.c - avoid copies
else {
v = as.call(list(as.name("list"), v))
ans <- point(ans, i, eval(v, x, parent.frame()), 1L)
}
} else {
if (!is.object(eval(v, x, parent.frame()))) {
v = as.call(list(as.name("list"), v))
ans = point(ans, i, eval(v, x, parent.frame()), 1L) # eval has to make a copy here (not due to list(.), but due to ex: "4-5*y"), unavoidable.
} else ans = point(ans, i, list(unlist(eval(v, x, parent.frame()))), 1L)
} # else stop("Column arguments to order by in 'forder' should be of type name/symbol (ex: quote(x)) or call (ex: quote(-x), quote(x+5*y))")
}
}
cols = seq_along(ans)
for (i in cols) {
if (!typeof(ans[[i]]) %chin% c("integer","logical","character","double"))
stop("Column '",i,"' is type '",typeof(ans[[i]]),"' which is not supported for ordering currently.")
}
o = forderv(ans, cols, sort=TRUE, retGrp=FALSE, order= if (decreasing) -order else order, na.last)
if (!length(o)) o = seq_along(ans[[1L]]) else o
o
}
fsort <- function(x, decreasing = FALSE, na.last = FALSE, ...)
{
o = forderv(x, order=!decreasing, na.last=na.last)
return( if (length(o)) x[o] else x ) # TO DO: document the nice efficiency here
}
setorder <- function(x, ..., na.last=FALSE)
# na.last=FALSE here, to be consistent with data.table's default
# as opposed to DT[order(.)] where na.last=TRUE, to be consistent with base
{
if (!is.data.frame(x)) stop("x must be a data.frame or data.table.")
cols = substitute(list(...))[-1]
if (identical(as.character(cols),"NULL")) return(x)
if (length(cols)) {
cols=as.list(cols)
order=rep(1L, length(cols))
for (i in seq_along(cols)) {
v=as.list(cols[[i]])
if (length(v) > 1 && v[[1L]] == "+") v=v[[-1L]]
else if (length(v) > 1 && v[[1L]] == "-") {
v=v[[-1L]]
order[i] = -1L
}
cols[[i]]=as.character(v)
}
cols=unlist(cols, use.names=FALSE)
} else {
cols=colnames(x)
order=rep(1L, length(cols))
}
setorderv(x, cols, order, na.last)
}
setorderv <- function(x, cols, order=1L, na.last=FALSE)
{
if (is.null(cols)) return(x)
if (!is.data.frame(x)) stop("x must be a data.frame or data.table")
na.last = as.logical(na.last)
if (is.na(na.last) || !length(na.last)) stop('na.last must be logical TRUE/FALSE')
if (!is.character(cols)) stop("cols is not a character vector. Please see further information in ?setorder.")
if (!length(cols)) {
warning("cols is a character vector of zero length. Use NULL instead, or wrap with suppressWarnings() to avoid this warning.")
return(x)
}
if (any(nchar(cols)==0)) stop("cols contains some blanks.") # TODO: probably I'm checking more than necessary here.. there are checks in 'forderv' as well
if (!length(cols)) {
cols = colnames(x) # All columns in the data.table, usually a few when used in this form
} else {
# remove backticks from cols
cols <- gsub("`", "", cols)
miss = !(cols %in% colnames(x))
if (any(miss)) stop("some columns are not in the data.table: " %+% cols[miss])
}
if (".xi" %in% colnames(x)) stop("x contains a column called '.xi'. Conflicts with internal use by data.table.")
for (i in cols) {
.xi = x[[i]] # [[ is copy on write, otherwise checking type would be copying each column
if (!typeof(.xi) %chin% c("integer","logical","character","double")) stop("Column '",i,"' is type '",typeof(.xi),"' which is not supported for ordering currently.")
}
if (!is.character(cols) || length(cols)<1) stop("'cols' should be character at this point in setkey.")
o = forderv(x, cols, sort=TRUE, retGrp=FALSE, order=order, na.last=na.last)
if (length(o)) {
.Call(Creorder, x, o)
if (is.data.frame(x) & !is.data.table(x)) {
.Call(Creorder, rn <- rownames(x), o)
setattr(x, 'row.names', rn)
}
setattr(x, 'sorted', NULL) # if 'forderv' is not 0-length, it means order has changed. So, set key to NULL, else retain key.
setattr(x, 'index', NULL) # remove secondary keys too. These could be reordered and retained, but simpler and faster to remove
}
invisible(x)
}
binary <- function(x) .Call(Cbinary, x)
setNumericRounding <- function(x) {.Call(CsetNumericRounding, as.integer(x)); invisible()}
getNumericRounding <- function() .Call(CgetNumericRounding)
SJ <- function(...) {
JDT = as.data.table(list(...))
setkey(JDT)
}
# S for Sorted, usually used in i to sort the i table
# TO DO?: Use the CJ list() replication method for SJ (inside as.data.table.list?, #2109) too to avoid alloc.col
CJ <- function(..., sorted = TRUE, unique = FALSE)
{
# Pass in a list of unique values, e.g. ids and dates
# Cross Join will then produce a join table with the combination of all values (cross product).
# The last vector is varied the quickest in the table, so dates should be last for roll for example
l = list(...)
if (unique) l = lapply(l, unique)
dups = FALSE # fix for #1513
# using rep.int instead of rep speeds things up considerably (but attributes are dropped).
j = lapply(l, class) # changed "vapply" to avoid errors with "ordered" "factor" input
if (length(l)==1L && sorted && length(o <- forderv(l[[1L]])))
l[[1L]] = l[[1L]][o]
else if (length(l) > 1L) {
n = vapply(l, length, 0L)
nrow = prod(n)
x = c(rev(take(cumprod(rev(n)))), 1L)
for (i in seq_along(x)) {
y = l[[i]]
# fix for #1513
if (sorted) {
if (length(o <- forderv(y, retGrp=TRUE))) y = y[o]
if (!dups) dups = attr(o, 'maxgrpn') > 1L
}
if (i == 1L)
l[[i]] = rep.int(y, times = rep.int(x[i], n[i])) # i.e. rep(y, each=x[i])
else if (i == length(n))
l[[i]] = rep.int(y, times = nrow/(x[i]*n[i]))
else
l[[i]] = rep.int(rep.int(y, times = rep.int(x[i], n[i])), times = nrow/(x[i]*n[i]))
if (any(class(l[[i]]) != j[[i]]))
setattr(l[[i]], 'class', j[[i]]) # reset "Date" class - rep.int coerces to integer
}
}
setattr(l, "row.names", .set_row_names(length(l[[1L]])))
setattr(l, "class", c("data.table", "data.frame"))
if (is.null(vnames <- names(l)))
vnames = vector("character", length(l))
if (any(tt <- vnames == "")) {
vnames[tt] = paste("V", which(tt), sep="")
setattr(l, "names", vnames)
}
l <- alloc.col(l) # a tiny bit wasteful to over-allocate a fixed join table (column slots only), doing it anyway for consistency, and it's possible a user may wish to use SJ directly outside a join and would expect consistent over-allocation.
if (sorted) {
if (!dups) setattr(l, 'sorted', names(l))
else setkey(l) # fix #1513
}
l
}