What tricks do people use to manage the available memory of an interactive R session? I use the functions below [based on postings by Petr Pikal and David Hinds to the r-help list in 2004] to list (and/or sort) the largest objects and to occassionallyrm() some of them. But by far the most effective solution was ... to run under 64-bit Linux with ample memory.
Any other nice tricks folks want to share? One per post, please.
# improved list of objects.ls.objects <- function (pos = 1, pattern, order.by, decreasing=FALSE, head=FALSE, n=5) { napply <- function(names, fn) sapply(names, function(x) fn(get(x, pos = pos))) names <- ls(pos = pos, pattern = pattern) obj.class <- napply(names, function(x) as.character(class(x))[1]) obj.mode <- napply(names, mode) obj.type <- ifelse(is.na(obj.class), obj.mode, obj.class) obj.size <- napply(names, object.size) obj.dim <- t(napply(names, function(x) as.numeric(dim(x))[1:2])) vec <- is.na(obj.dim)[, 1] & (obj.type != "function") obj.dim[vec, 1] <- napply(names, length)[vec] out <- data.frame(obj.type, obj.size, obj.dim) names(out) <- c("Type", "Size", "Rows", "Columns") if (!missing(order.by)) out <- out[order(out[[order.by]], decreasing=decreasing), ] if (head) out <- head(out, n) out}# shorthandlsos <- function(..., n=10) { .ls.objects(..., order.by="Size", decreasing=TRUE, head=TRUE, n=n)}- 1Note, I do NOT doubt it, but what's the use of that? I am pretty new to memory problems in R, but I am experiencing some lately (that's why I was searching for this post:) – so am I just starting with all this. How does this help my daily work?Matt Bannert– Matt Bannert2011-02-02 09:34:23 +00:00CommentedFeb 2, 2011 at 9:34
- 5if you want to see the objects within a function, you have to use: lsos(pos = environment()), otherwise it'll only show global variables. To write to standard error: write.table(lsos(pos=environment()), stderr(), quote=FALSE, sep='\t')Michael Kuhn– Michael Kuhn2011-04-05 11:56:47 +00:00CommentedApr 5, 2011 at 11:56
- Why 64-bit linux and not 64-bit Windows? Does the choice of OS make a non-trivial difference when I have 32GB of ram to use?Jase– Jase2012-10-07 10:01:56 +00:00CommentedOct 7, 2012 at 10:01
- 3@pepsimax: This has been packaged in the
multilevelPSApackage. The package is designed for something else, but you can use the function from there without loading the package by sayingrequireNamespace(multilevelPSA); multilevelPSA::lsos(...). Or in theDmiscpackage (not on CRAN).krlmlr– krlmlr2013-11-12 10:22:28 +00:00CommentedNov 12, 2013 at 10:22 - 2If the data set is of a manageable size, I usually go to R studio>Environment>Grid View. Here you can see and sort all items in your current environment based on the size.kRazzy R– kRazzy R2016-11-20 03:14:15 +00:00CommentedNov 20, 2016 at 3:14
28 Answers28
Ensure you record your work in a reproducible script. From time-to-time, reopen R, thensource() your script. You'll clean out anything you're no longer using, and as an added benefit will have tested your code.
15 Comments
1-load.r,2-explore.r,3-model.r - that way it's obvious to others that there is some order present.I use thedata.table package. With its:= operator you can :
- Add columns by reference
- Modify subsets of existing columns by reference, and by group by reference
- Delete columns by reference
None of these operations copy the (potentially large)data.table at all, not even once.
- Aggregation is also particularly fast because
data.tableuses much less working memory.
Related links :
Comments
Saw this on a twitter post and think it's an awesome function by Dirk! Following on fromJD Long's answer, I would do this for user friendly reading:
# improved list of objects.ls.objects <- function (pos = 1, pattern, order.by, decreasing=FALSE, head=FALSE, n=5) { napply <- function(names, fn) sapply(names, function(x) fn(get(x, pos = pos))) names <- ls(pos = pos, pattern = pattern) obj.class <- napply(names, function(x) as.character(class(x))[1]) obj.mode <- napply(names, mode) obj.type <- ifelse(is.na(obj.class), obj.mode, obj.class) obj.prettysize <- napply(names, function(x) { format(utils::object.size(x), units = "auto") }) obj.size <- napply(names, object.size) obj.dim <- t(napply(names, function(x) as.numeric(dim(x))[1:2])) vec <- is.na(obj.dim)[, 1] & (obj.type != "function") obj.dim[vec, 1] <- napply(names, length)[vec] out <- data.frame(obj.type, obj.size, obj.prettysize, obj.dim) names(out) <- c("Type", "Size", "PrettySize", "Length/Rows", "Columns") if (!missing(order.by)) out <- out[order(out[[order.by]], decreasing=decreasing), ] if (head) out <- head(out, n) out} # shorthandlsos <- function(..., n=10) { .ls.objects(..., order.by="Size", decreasing=TRUE, head=TRUE, n=n)}lsos()Which results in something like the following:
Type Size PrettySize Length/Rows Columnspca.res PCA 790128 771.6 Kb 7 NADF data.frame 271040 264.7 Kb 669 50factor.AgeGender factanal 12888 12.6 Kb 12 NAdates data.frame 9016 8.8 Kb 669 2sd. numeric 3808 3.7 Kb 51 NAnapply function 2256 2.2 Kb NA NAlsos function 1944 1.9 Kb NA NAload loadings 1768 1.7 Kb 12 2ind.sup integer 448 448 bytes 102 NAx character 96 96 bytes 1 NANOTE: The main part I added was (again, adapted from JD's answer) :
obj.prettysize <- napply(names, function(x) { print(object.size(x), units = "auto") })5 Comments
capture.output is not neccessary anymore, andobj.prettysize <- napply(names, function(x) {format(utils::object.size(x), units = "auto") }) produces clean output. In fact, not removing it produces unwanted quotes in the output, i.e.[1] "792.5 Mb" instead of792.5 Mb.obj.class <- napply(names, function(x) as.character(class(x))[1]) toobj.class <- napply(names, function(x) class(x)[1]) sinceclass always return a vector of characters now (base-3.5.0).improved list of objects to a specific environment?I make aggressive use of thesubset parameter with selection of only the required variables when passing dataframes to thedata= argument of regression functions. It does result in some errors if I forget to add variables to both the formula and theselect= vector, but it still saves a lot of time due to decreased copying of objects and reduces the memory footprint significantly. Say I have 4 million records with 110 variables (and I do.) Example:
# library(rms); library(Hmisc) for the cph,and rcs functionsMayo.PrCr.rbc.mdl <- cph(formula = Surv(surv.yr, death) ~ age + Sex + nsmkr + rcs(Mayo, 4) + rcs(PrCr.rat, 3) + rbc.cat * Sex, data = subset(set1HLI, gdlab2 & HIVfinal == "Negative", select = c("surv.yr", "death", "PrCr.rat", "Mayo", "age", "Sex", "nsmkr", "rbc.cat") ) )By way of setting context and the strategy: thegdlab2 variable is a logical vector that was constructed for subjects in a dataset that had all normal or almost normal values for a bunch of laboratory tests andHIVfinal was a character vector that summarized preliminary and confirmatory testing for HIV.
Comments
I love Dirk's .ls.objects() script but I kept squinting to count characters in the size column. So I did some ugly hacks to make it present with pretty formatting for the size:
.ls.objects <- function (pos = 1, pattern, order.by, decreasing=FALSE, head=FALSE, n=5) { napply <- function(names, fn) sapply(names, function(x) fn(get(x, pos = pos))) names <- ls(pos = pos, pattern = pattern) obj.class <- napply(names, function(x) as.character(class(x))[1]) obj.mode <- napply(names, mode) obj.type <- ifelse(is.na(obj.class), obj.mode, obj.class) obj.size <- napply(names, object.size) obj.prettysize <- sapply(obj.size, function(r) prettyNum(r, big.mark = ",") ) obj.dim <- t(napply(names, function(x) as.numeric(dim(x))[1:2])) vec <- is.na(obj.dim)[, 1] & (obj.type != "function") obj.dim[vec, 1] <- napply(names, length)[vec] out <- data.frame(obj.type, obj.size,obj.prettysize, obj.dim) names(out) <- c("Type", "Size", "PrettySize", "Rows", "Columns") if (!missing(order.by)) out <- out[order(out[[order.by]], decreasing=decreasing), ] out <- out[c("Type", "PrettySize", "Rows", "Columns")] names(out) <- c("Type", "Size", "Rows", "Columns") if (head) out <- head(out, n) out}Comments
That's a good trick.
One other suggestion is to use memory efficient objects wherever possible: for instance, use a matrix instead of a data.frame.
This doesn't really address memory management, but one important function that isn't widely known is memory.limit(). You can increase the default using this command, memory.limit(size=2500), where the size is in MB. As Dirk mentioned, you need to be using 64-bit in order to take real advantage of this.
3 Comments
I quite like the improved objects function developed by Dirk. Much of the time though, a more basic output with the object name and size is sufficient for me. Here's a simpler function with a similar objective. Memory use can be ordered alphabetically or by size, can be limited to a certain number of objects, and can be ordered ascending or descending. Also, I often work with data that are 1GB+, so the function changes units accordingly.
showMemoryUse <- function(sort="size", decreasing=FALSE, limit) { objectList <- ls(parent.frame()) oneKB <- 1024 oneMB <- 1048576 oneGB <- 1073741824 memoryUse <- sapply(objectList, function(x) as.numeric(object.size(eval(parse(text=x))))) memListing <- sapply(memoryUse, function(size) { if (size >= oneGB) return(paste(round(size/oneGB,2), "GB")) else if (size >= oneMB) return(paste(round(size/oneMB,2), "MB")) else if (size >= oneKB) return(paste(round(size/oneKB,2), "kB")) else return(paste(size, "bytes")) }) memListing <- data.frame(objectName=names(memListing),memorySize=memListing,row.names=NULL) if (sort=="alphabetical") memListing <- memListing[order(memListing$objectName,decreasing=decreasing),] else memListing <- memListing[order(memoryUse,decreasing=decreasing),] #will run if sort not specified or "size" if(!missing(limit)) memListing <- memListing[1:limit,] print(memListing, row.names=FALSE) return(invisible(memListing))}And here is some example output:
> showMemoryUse(decreasing=TRUE, limit=5) objectName memorySize coherData 713.75 MB spec.pgram_mine 149.63 kB stoch.reg 145.88 kB describeBy 82.5 kB lmBandpass 68.41 kBComments
I never save an R workspace. I use import scripts and data scripts and output any especially large data objects that I don't want to recreate often to files. This way I always start with a fresh workspace and don't need to clean out large objects. That is a very nice function though.
Comments
Unfortunately I did not have time to test it extensively but here is a memory tip that I have not seen before. For me the required memory was reduced with more than 50%.When you read stuff into R with for example read.csv they require a certain amount of memory.After this you can save them withsave("Destinationfile",list=ls())The next time you open R you can useload("Destinationfile")Now the memory usage might have decreased.It would be nice if anyone could confirm whether this produces similar results with a different dataset.
4 Comments
fread, then saved to .RData. The RData files were indeed about 70% smaller but after re-loading, the memory used were exactly the same. Was hoping this trick will reduce the memory footprint... am I missing something?To further illustrate the common strategy of frequent restarts, we can uselittler which allows us to run simple expressions directly from the command-line. Here is an example I sometimes use to time different BLAS for a simple crossprod.
r -e'N<-3*10^3; M<-matrix(rnorm(N*N),ncol=N); print(system.time(crossprod(M)))'Likewise,
r -lMatrix -e'example(spMatrix)'loads the Matrix package (via the --packages | -l switch) and runs the examples of the spMatrix function. As r always starts 'fresh', this method is also a good test during package development.
Last but not least r also work great for automated batch mode in scripts using the '#!/usr/bin/r' shebang-header. Rscript is an alternative where littler is unavailable (e.g. on Windows).
1 Comment
For both speed and memory purposes, when building a large data frame via some complex series of steps, I'll periodically flush it (the in-progress data set being built) to disk, appending to anything that came before, and then restart it. This way the intermediate steps are only working on smallish data frames (which is good as, e.g.,rbind slows down considerably with larger objects). The entire data set can be read back in at the end of the process, when all the intermediate objects have been removed.
dfinal <- NULLfirst <- TRUEtempfile <- "dfinal_temp.csv"for( i in bigloop ) { if( !i %% 10000 ) { print( i, "; flushing to disk..." ) write.table( dfinal, file=tempfile, append=!first, col.names=first ) first <- FALSE dfinal <- NULL # nuke it } # ... complex operations here that add data to 'dfinal' data frame }print( "Loop done; flushing to disk and re-reading entire data set..." )write.table( dfinal, file=tempfile, append=TRUE, col.names=FALSE )dfinal <- read.table( tempfile )Comments
Just to note thatdata.table package'stables() seems to be a pretty good replacement for Dirk's.ls.objects() custom function (detailed in earlier answers), although just for data.frames/tables and not e.g. matrices, arrays, lists.
1 Comment
I'm fortunate and my large data sets are saved by the instrument in "chunks" (subsets) of roughly 100 MB (32bit binary). Thus I can do pre-processing steps (deleting uninformative parts, downsampling) sequentially before fusing the data set.
Calling
gc ()"by hand" can help if the size of the data get close to available memory.Sometimes a different algorithm needs much less memory.
Sometimes there's a trade off between vectorization and memory use.
compare:split&lapplyvs. aforloop.For the sake of fast & easy data analysis, I often work first with a small random subset (
sample ()) of the data. Once the data analysis script/.Rnw is finished data analysis code and the complete data go to the calculation server for over night / over weekend / ... calculation.
Comments
The use of environments instead of lists to handle collections of objects which occupy a significant amount of working memory.
The reason: each time an element of alist structure is modified, the whole list is temporarily duplicated. This becomes an issue if the storage requirement of the list is about half the available working memory, because then data has to be swapped to the slow hard disk. Environments, on the other hand, aren't subject to this behaviour and they can be treated similar to lists.
Here is an example:
get.data <- function(x){ # get some data based on x return(paste("data from",x))}collect.data <- function(i,x,env){ # get some data data <- get.data(x[[i]]) # store data into environment element.name <- paste("V",i,sep="") env[[element.name]] <- data return(NULL) }better.list <- new.env()filenames <- c("file1","file2","file3")lapply(seq_along(filenames),collect.data,x=filenames,env=better.list)# read/write accessprint(better.list[["V1"]])better.list[["V2"]] <- "testdata"# number of list elementslength(ls(better.list))In conjunction with structures such asbig.matrix ordata.table which allow for altering their content in-place, very efficient memory usage can be achieved.
1 Comment
Thellfunction ingData package can show the memory usage of each object as well.
gdata::ll(unit='MB')3 Comments
If you really want to avoid the leaks, you should avoid creating any big objects in the global environment.
What I usually do is to have a function that does the job and returnsNULL — all data is read and manipulated in this function or others that it calls.
Comments
With only 4GB of RAM (running Windows 10, so make that about 2 or more realistically 1GB) I've had to be real careful with the allocation.
I use data.table almost exclusively.
The 'fread' function allows you to subset information by field names on import; only import the fields that are actually needed to begin with. If you're using base R read, null the spurious columns immediately after import.
As42- suggests, where ever possible I will then subset within the columns immediately after importing the information.
I frequently rm() objects from the environment as soon as they're no longer needed, e.g. on the next line after using them to subset something else, and call gc().
'fread' and 'fwrite' from data.table can bevery fast by comparison with base R reads and writes.
Askpierce8 suggests, I almost always fwrite everything out of the environment and fread it back in, even with thousand / hundreds of thousands of tiny files to get through. This not only keeps the environment 'clean' and keeps the memory allocation low but, possibly due to the severe lack of RAM available, R has a propensity for frequently crashing on my computer; really frequently. Having the information backed up on the drive itself as the code progresses through various stages means I don't have to start right from the beginning if it crashes.
As of 2017, I think the fastest SSDs are running around a few GB per second through the M2 port. I have a really basic 50GB Kingston V300 (550MB/s) SSD that I use as my primary disk (has Windows and R on it). I keep all the bulk information on a cheap 500GB WD platter. I move the data sets to the SSD when I start working on them. This, combined with 'fread'ing and 'fwrite'ing everything has been working out great. I've tried using 'ff' but prefer the former. 4K read/write speeds can create issues with this though; backing up a quarter of a million 1k files (250MBs worth) from the SSD to the platter can take hours. As far as I'm aware, there isn't any R package available yet that can automatically optimise the 'chunkification' process; e.g. look at how much RAM a user has, test the read/write speeds of the RAM / all the drives connected and then suggest an optimal 'chunkification' protocol. This could produce some significant workflow improvements / resource optimisations; e.g. split it to ... MB for the ram -> split it to ... MB for the SSD -> split it to ... MB on the platter -> split it to ... MB on the tape. It could sample data sets beforehand to give it a more realistic gauge stick to work from.
A lot of the problems I've worked on in R involve forming combination and permutation pairs, triples etc, which only makes having limited RAM more of a limitation as they will oftenat least exponentially expand at some point. This has made me focus a lot of attention on thequality as opposed toquantity of information going into them to begin with, rather than trying to clean it up afterwards, and on the sequence of operations in preparing the information to begin with (starting with the simplest operation and increasing the complexity); e.g. subset, then merge / join, then form combinations / permutations etc.
There do seem to be some benefits to using base R read and write in some instances. For instance, the error detection within 'fread' is so good it can be difficult trying to get really messy information into R to begin with to clean it up. Base R also seems to be a lot easier if you're using Linux. Base R seems to work fine in Linux, Windows 10 uses ~20GB of disc space whereas Ubuntu only needs a few GB, the RAM needed with Ubuntu is slightly lower. But I've noticed large quantities of warnings and errors when installing third party packages in (L)Ubuntu. I wouldn't recommend drifting too far away from (L)Ubuntu or other stock distributions with Linux as you can loose so much overall compatibility it renders the process almost pointless (I think 'unity' is due to be cancelled in Ubuntu as of 2017). I realise this won't go down well with some Linux users but some of the custom distributions are borderline pointless beyond novelty (I've spent years using Linux alone).
Hopefully some of that might help others out.
Comments
This is a newer answer to this excellent old question. From Hadley's Advanced R:
install.packages("pryr")library(pryr)object_size(1:10)## 88 Bobject_size(mean)## 832 Bobject_size(mtcars)## 6.74 kBComments
This adds nothing to the above, but is written in the simple and heavily commented style that I like. It yields a table with the objects ordered in size , but without some of the detail given in the examples above:
#Find the objects MemoryObjects = ls() #Create an arrayMemoryAssessmentTable=array(NA,dim=c(length(MemoryObjects),2))#Name the columnscolnames(MemoryAssessmentTable)=c("object","bytes")#Define the first column as the objectsMemoryAssessmentTable[,1]=MemoryObjects#Define a function to determine size MemoryAssessmentFunction=function(x){object.size(get(x))}#Apply the function to the objectsMemoryAssessmentTable[,2]=t(t(sapply(MemoryAssessmentTable[,1],MemoryAssessmentFunction)))#Produce a table with the largest objects firstnoquote(MemoryAssessmentTable[rev(order(as.numeric(MemoryAssessmentTable[,2]))),])Comments
As well as the more general memory management techniques given in the answers above, I always try to reduce the size of my objects as far as possible. For example, I work with very large but very sparse matrices, in other words matrices where most values are zero. Using the 'Matrix' package (capitalisation important) I was able to reduce my average object sizes from ~2GB to ~200MB as simply as:
my.matrix <- Matrix(my.matrix)The Matrix package includes data formats that can be used exactly like a regular matrix (no need to change your other code) but are able to store sparse data much more efficiently, whether loaded into memory or saved to disk.
Additionally, the raw files I receive are in 'long' format where each data point has variablesx, y, z, i. Much more efficient to transform the data into anx * y * z dimension array with only variablei.
Know your data and use a bit of common sense.
Comments
If you are working onLinux and want to useseveral processes and only have to doread operations on one or morelarge objects usemakeForkCluster instead of amakePSOCKcluster. This also saves you the time sending the large object to the other processes.
Comments
I really appreciate some of the answers above, following @hadley and @Dirk that suggest closing R and issuingsource and using command line I come up with a solution that worked very well for me. I had to deal with hundreds of mass spectras, each occupies around 20 Mb of memory so I used two R scripts, as follows:
First a wrapper:
#!/usr/bin/Rscript --vanilla --default-packages=utilsfor(l in 1:length(fdir)) { for(k in 1:length(fds)) { system(paste("Rscript runConsensus.r", l, k)) }}with this script I basically control what my main script dorunConsensus.r, and I write the data answer for the output. With this, each time the wrapper calls the script it seems the R is reopened and the memory is freed.
Hope it helps.
Comments
Tip for dealing with objects requiring heavy intermediate calculation: When using objects that require a lot of heavy calculation and intermediate steps to create, I often find it useful to write a chunk of code with the function to create the object, and then a separate chunk of code that gives me the option either to generate and save the object as anrmd file, or load it externally from anrmd file I have already previously saved. This is especially easy to do inR Markdown using the following code-chunk structure.
```{r Create OBJECT}COMPLICATED.FUNCTION <- function(...) { Do heavy calculations needing lots of memory; Output OBJECT; }``````{r Generate or load OBJECT}LOAD <- TRUESAVE <- TRUE#NOTE: Set LOAD to TRUE if you want to load saved file#NOTE: Set LOAD to FALSE if you want to generate the object from scratch#NOTE: Set SAVE to TRUE if you want to save the object externallyif(LOAD) { OBJECT <- readRDS(file = 'MySavedObject.rds') } else { OBJECT <- COMPLICATED.FUNCTION(x, y, z) if (SAVE) { saveRDS(file = 'MySavedObject.rds', object = OBJECT) } }```With this code structure, all I need to do is to changeLOAD depending on whether I want to generate the object, or load it directly from an existing saved file. (Of course, I have to generate it and save it the first time, but after this I have the option of loading it.) SettingLOAD <- TRUE bypasses use of my complicated function and avoids all of the heavy computation therein. This method still requires enough memory to store the object of interest, but it saves you from having to calculate it each time you run your code. For objects that require a lot of heavy calculation of intermediate steps (e.g., for calculations involving loops over large arrays) this can save a substantial amount of time and computation.
Comments
Running
for (i in 1:10) gc(reset = T)from time to time also helps R to free unused but still not released memory.
3 Comments
for loop do here? There's noi in thegc call.gc(reset = T) nine timesYou also can get some benefit using knitr and puting your script in Rmd chuncks.
I usually divide the code in different chunks and select which one will save a checkpoint to cache or to a RDS file, and
Over there you can set a chunk to be saved to "cache", or you can decide to run or not a particular chunk. In this way, in a first run you can process only "part 1", another execution you can select only "part 2", etc.
Example:
part1```{r corpus, warning=FALSE, cache=TRUE, message=FALSE, eval=TRUE}corpusTw <- corpus(twitter) # build the corpus```part2```{r trigrams, warning=FALSE, cache=TRUE, message=FALSE, eval=FALSE}dfmTw <- dfm(corpusTw, verbose=TRUE, removeTwitter=TRUE, ngrams=3)```As a side effect, this also could save you some headaches in terms of reproducibility :)
Comments
Based on @Dirk's and @Tony's answer I have made a slight update. The result was outputting[1] before the pretty size values, so I took out thecapture.output which solved the problem:
.ls.objects <- function (pos = 1, pattern, order.by, decreasing=FALSE, head=FALSE, n=5) {napply <- function(names, fn) sapply(names, function(x) fn(get(x, pos = pos)))names <- ls(pos = pos, pattern = pattern)obj.class <- napply(names, function(x) as.character(class(x))[1])obj.mode <- napply(names, mode)obj.type <- ifelse(is.na(obj.class), obj.mode, obj.class)obj.prettysize <- napply(names, function(x) { format(utils::object.size(x), units = "auto") })obj.size <- napply(names, utils::object.size)obj.dim <- t(napply(names, function(x) as.numeric(dim(x))[1:2]))vec <- is.na(obj.dim)[, 1] & (obj.type != "function")obj.dim[vec, 1] <- napply(names, length)[vec]out <- data.frame(obj.type, obj.size, obj.prettysize, obj.dim)names(out) <- c("Type", "Size", "PrettySize", "Rows", "Columns")if (!missing(order.by)) out <- out[order(out[[order.by]], decreasing=decreasing), ]if (head) out <- head(out, n)return(out)}# shorthandlsos <- function(..., n=10) { .ls.objects(..., order.by="Size", decreasing=TRUE, head=TRUE, n=n)}lsos()Comments
I try to keep the amount of objects small when working in a larger project with a lot of intermediate steps. So instead of creating many unique objects called
dataframe->step1 ->step2 ->step3 ->result
raster->multipliedRast ->meanRastF ->sqrtRast ->resultRast
I work with temporary objects that I calltemp.
dataframe ->temp ->temp ->temp ->result
Which leaves me with less intermediate files and more overview.
raster <- raster('file.tif')temp <- raster * 10temp <- mean(temp)resultRast <- sqrt(temp)To save more memory I can simply removetemp when no longer needed.
rm(temp)If I need several intermediate files, I usetemp1,temp2,temp3.
For testing I usetest,test2, ...
Comments
rm(list=ls()) is a great way to keep you honest and keep things reproducible.
1 Comment
Explore related questions
See similar questions with these tags.













