de_serialize works. Variables names improved. Code beautified. TODO: clustering tests
[epclust.git] / epclust / R / utils.R
diff --git a/epclust/R/utils.R b/epclust/R/utils.R
deleted file mode 100644 (file)
index 40b0a18..0000000
+++ /dev/null
@@ -1,75 +0,0 @@
-toInteger <- function(x, condition)
-{
-       if (!is.integer(x))
-               tryCatch(
-                       {x = as.integer(x)[1]},
-                       error = function(e) paste("cannot convert argument",substitute(x),"to integer")
-               )
-       if (!condition(x))
-               stop(paste("argument",substitute(x),"does not verify condition",body(condition)))
-       x
-}
-
-curvesToCoeffs = function(series, wf)
-{
-       L = length(series[1,])
-       D = ceiling( log2(L) )
-       nb_sample_points = 2^D
-       apply(series, 1, function(x) {
-               interpolated_curve = spline(1:L, x, n=nb_sample_points)$y
-               W = wavelets::dwt(interpolated_curve, filter=wf, D)@W
-               rev( sapply( W, function(v) ( sqrt( sum(v^2) ) ) ) )
-       })
-}
-
-#data: matrix of double or connection
-serialize = function(data, file, type, nb_per_chunk)
-{
-       bin_data = file(file, "ab")
-       #write data length on first call
-       nbytes = ifelse(type=="double",8,4)
-       first_write = FALSE
-       if (file.info(file)$size == 0)
-       {
-               #number of items always on 8 bytes
-               writeBin(0L, bin_data, size=8) #,endian="little")
-               first_write = TRUE
-       }
-       if (is.matrix(data))
-       {
-               writeBin(t(data), bin_data, size=nbytes)
-               data_length = ncol(data)
-       }
-       else #if (is(data, "connection"))
-       {
-               if (first_write)
-               {
-                       data_line = scan(data, double(), sep=",", nlines=1)
-                       writeBin(data_line, bin_data, size=nbytes)
-                       data_length = length(data_line)
-               }
-               repeat
-               {
-                       data_chunk = scan(data, double(), sep=",", nlines=nb_per_chunk)
-                       if (length(data_chunk)==0)
-                               break
-                       writeBin(data_chunk, bin_data, size=nbytes)
-               }
-       }
-       if (first_write)
-       {
-               #ecrire file_size-1 / (nbytes*nbWritten) en 0 dans bin_data ! ignored == file_size
-               ignored = seek(bin_data, 0)
-               writeBin(data_length, bin_data, size=8)
-       }
-       close(bin_data)
-}
-
-#TODO: read in binary file, always same structure
-getDataFromFile(indices, file, type)
-{
-       bin_data = file(file, "rb")
-       nbytes = ifelse(type=="double",8,4)
-       data_length = readBin(bin_data,"double",1,nbytes) #,endian="little")
-       t(sapply(indices, function(i) readBin(bin_data,"double",n=data_length,size=nbytes)))
-}