1 #' Two-stage clustering, within one task (see \code{claws()})
3 #' \code{clusteringTask1()} runs one full stage-1 task, which consists in iterated
4 #' clustering on nb_curves / ntasks energy contributions, computed through
5 #' discrete wavelets coefficients.
6 #' \code{clusteringTask2()} runs a full stage-2 task, which consists in WER distances
7 #' computations between medoids (indices) output from stage 1, before applying
8 #' the second clustering algorithm on the distances matrix.
10 #' @param getContribs Function to retrieve contributions from initial series indices:
11 #' \code{getContribs(indices)} outputs a contributions matrix, in columns
12 #' @inheritParams claws
13 #' @inheritParams computeSynchrones
14 #' @inheritParams computeWerDists
16 #' @return The indices of the computed (resp. K1 and K2) medoids.
20 #' @aliases clusteringTask1 clusteringTask2
25 clusteringTask1 <- function(indices, getContribs, K1, algoClust1, nb_items_clust,
26 ncores_clust=3, verbose=FALSE)
29 cat(paste("*** Clustering task 1 on ",length(indices)," series [start]\n", sep=""))
31 if (length(indices) <= K1)
34 parll <- (ncores_clust > 1)
37 # outfile=="" to see stderr/stdout on terminal
40 parallel::makeCluster(ncores_clust, outfile = "")
42 parallel::makeCluster(ncores_clust)
43 parallel::clusterExport(cl, c("getContribs","K1","verbose"), envir=environment())
45 # Iterate clustering algorithm 1 until K1 medoids are found
46 while (length(indices) > K1)
48 # Balance tasks by splitting the indices set - as evenly as possible
49 indices_workers <- .splitIndices(indices, nb_items_clust, min_size=K1+1)
53 unlist( parallel::parLapply(cl, indices_workers, function(inds) {
54 require("epclust", quietly=TRUE)
55 inds[ algoClust1(getContribs(inds), K1) ]
60 unlist( lapply(indices_workers, function(inds)
61 inds[ algoClust1(getContribs(inds), K1) ]
66 cat(paste("*** Clustering task 1 on ",length(indices)," medoids [iter]\n", sep=""))
70 parallel::stopCluster(cl)
77 clusteringTask2 <- function(indices, getSeries, K2, algoClust2, nb_series_per_chunk,
78 smooth_lvl, nvoice, nbytes, endian, ncores_clust=3, verbose=FALSE)
81 cat(paste("*** Clustering task 2 on ",length(indices)," medoids\n", sep=""))
83 if (length(indices) <= K2)
86 # A) Compute the WER distances (Wavelets Extended coefficient of deteRmination)
87 distances <- computeWerDists(indices, getSeries, nb_series_per_chunk,
88 smooth_lvl, nvoice, nbytes, endian, ncores_clust, verbose)
90 # B) Apply clustering algorithm 2 on the WER distances matrix
92 cat(paste("*** algoClust2() on ",nrow(distances)," items\n", sep=""))
93 indices[ algoClust2(distances,K2) ]