diff --git a/DESCRIPTION b/DESCRIPTION index 9c5eef6d..64cdc308 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -1,6 +1,6 @@ Package: hipercow Title: High Performance Computing -Version: 1.0.35 +Version: 1.0.36 Authors@R: c(person("Rich", "FitzJohn", role = c("aut", "cre"), email = "rich.fitzjohn@gmail.com"), person("Wes", "Hinsley", role = "aut"), @@ -11,7 +11,7 @@ Description: Set up cluster environments and jobs. Moo. License: MIT + file LICENSE Encoding: UTF-8 Roxygen: list(markdown = TRUE) -RoxygenNote: 7.3.1 +RoxygenNote: 7.3.2 URL: https://github.com/mrc-ide/hipercow, https://mrc-ide.github.io/hipercow BugReports: https://github.com/mrc-ide/hipercow/issues Imports: @@ -19,6 +19,7 @@ Imports: cli, fs, ids, + pkgdepends, rlang, withr Suggests: @@ -32,7 +33,6 @@ Suggests: logwatch, mockery, openssl, - pkgdepends, prettyunits, redux, rmarkdown, diff --git a/R/windows.R b/R/windows.R index 05aaada9..8fc9f3f0 100644 --- a/R/windows.R +++ b/R/windows.R @@ -60,13 +60,13 @@ windows_check <- function(path = getwd()) { ##' written in `/etc/fstab`) ##' ##' @param path_remote The network path for this drive. It -##' will look something like `\\\\fi--didef3.dide.ic.ac.uk\\tmp\\`. +##' will look something like `\\\\projects.dide.ic.ac.uk\\tmp\\`. ##' Unfortunately backslashes are really hard to get right here and ##' you will need to use twice as many as you expect (so *four* ##' backslashes at the beginning and then two for each separator). ##' If this makes you feel bad know that you are not alone: ##' https://xkcd.com/1638 -- alternatively you may use forward -##' slashes in place of backslashes (e.g. `//fi--didef3.dide.ic.ac.uk/tmp`) +##' slashes in place of backslashes (e.g. `//projects.dide.ic.ac.uk/tmp`) ##' ##' @param drive_remote The place to mount the drive on the cluster. ##' We're probably going to mount things at Q: and T: already so @@ -83,7 +83,7 @@ windows_check <- function(path = getwd()) { ##' # this as "M:" when running tasks by first creating a path ##' # mapping: ##' share <- windows_path("~/net/malaria", -##' "//fi--didenas1.dide.ic.ac.uk/Malaria", +##' "//wpia-hn.hpc.dide.ic.ac.uk/Malaria", ##' "M:") ##' ##' # This share object contains information about how to relate your diff --git a/drivers/windows/DESCRIPTION b/drivers/windows/DESCRIPTION index 2581f5d5..cdb6603d 100644 --- a/drivers/windows/DESCRIPTION +++ b/drivers/windows/DESCRIPTION @@ -1,6 +1,6 @@ Package: hipercow.windows Title: DIDE HPC Support for Windows -Version: 1.0.35 +Version: 1.0.36 Authors@R: c(person("Rich", "FitzJohn", role = c("aut", "cre"), email = "rich.fitzjohn@gmail.com"), person("Wes", "Hinsley", role = "aut"), diff --git a/drivers/windows/R/driver.R b/drivers/windows/R/driver.R index ea6c97e8..5f2e2d24 100644 --- a/drivers/windows/R/driver.R +++ b/drivers/windows/R/driver.R @@ -105,7 +105,7 @@ windows_keypair <- function(config, path_root) { i = "Please run 'windows_keypair_generate()' to generate a keypair"), parent = e) }) - key <- sprintf("//fi--san03.dide.ic.ac.uk/homes/%s/.hipercow/key", username) + key <- sprintf("//qdrive.dide.ic.ac.uk/homes/%s/.hipercow/key", username) list(pub = pub, key = key) } diff --git a/drivers/windows/R/keys.R b/drivers/windows/R/keys.R index f873267e..60b36bd4 100644 --- a/drivers/windows/R/keys.R +++ b/drivers/windows/R/keys.R @@ -13,7 +13,7 @@ windows_generate_keypair <- function(update = FALSE, call = NULL) { return(invisible()) } } - share <- sprintf("//fi--san03.dide.ic.ac.uk/homes/%s", username) + share <- sprintf("//qdrive.dide.ic.ac.uk/homes/%s", username) share_local <- dide_locally_resolve_unc_path(share) if (!is.null(share_local) && file.exists(share_local)) { pub <- windows_generate_keypair_locally(share_local) diff --git a/drivers/windows/tests/testthat/helper-config.R b/drivers/windows/tests/testthat/helper-config.R index add433f7..c651f376 100644 --- a/drivers/windows/tests/testthat/helper-config.R +++ b/drivers/windows/tests/testthat/helper-config.R @@ -11,10 +11,10 @@ example_root <- function(mount_path, sub = "b/c") { example_mounts <- function(root) { - remote <- c("\\\\fi--didef3\\other", - "\\\\fi--san03\\homes\\bob", - "\\\\fi--didenas1\\Project", - "\\\\fi--didef3\\tmp", + remote <- c("\\\\projects\\other", + "\\\\qdrive\\homes\\bob", + "\\\\wpia-hn\\Project", + "\\\\projects\\tmp", "\\\\wpia-hn\\newshare") local <- file.path(root, c("other", "home", "proj", "temp", "sk")) fs::dir_create(file.path(local, "sub")) diff --git a/drivers/windows/tests/testthat/test-keypair.R b/drivers/windows/tests/testthat/test-keypair.R index d8b99516..834bfb56 100644 --- a/drivers/windows/tests/testthat/test-keypair.R +++ b/drivers/windows/tests/testthat/test-keypair.R @@ -33,7 +33,7 @@ test_that("can generate a keypair", { mockery::expect_called(mock_resolve, 1) expect_equal(mockery::mock_args(mock_resolve)[[1]], - list("//fi--san03.dide.ic.ac.uk/homes/bob")) + list("//qdrive.dide.ic.ac.uk/homes/bob")) mockery::expect_called(mock_key_set, 1) expect_equal( @@ -129,5 +129,5 @@ test_that("can fetch keypair", { expect_equal( res, list(pub = pubkey, - key = "//fi--san03.dide.ic.ac.uk/homes/bob/.hipercow/key")) + key = "//qdrive.dide.ic.ac.uk/homes/bob/.hipercow/key")) }) diff --git a/drivers/windows/tests/testthat/test-mounts.R b/drivers/windows/tests/testthat/test-mounts.R index 229964eb..0e49b2ba 100644 --- a/drivers/windows/tests/testthat/test-mounts.R +++ b/drivers/windows/tests/testthat/test-mounts.R @@ -79,16 +79,16 @@ test_that("Parse return value into sensible output (linux)", { paths <- file.path(tmp, c("other", "home", "malaria")) fs::dir_create(paths) dat <- c( - "//fi--didef3/other on %s/other type cifs (rw,relatime)", - "//fi--san03/homes/bob on %s/home type cifs (rw,relatime)", - "//fi--didenas1/Malaria on %s/malaria type cifs (rw,relatime)") + "//projects/other on %s/other type cifs (rw,relatime)", + "//qdrive/homes/bob on %s/home type cifs (rw,relatime)", + "//wpia-hn/Malaria on %s/malaria type cifs (rw,relatime)") dat <- vcapply(dat, function(x) sprintf(x, tmp), USE.NAMES = FALSE) mock_system2 <- mockery::mock(dat) mockery::stub(detect_mounts_unix, "system2", mock_system2) res <- detect_mounts_unix() - cmp <- cbind(remote = c("\\\\fi--didef3\\other", - "\\\\fi--san03\\homes\\bob", - "\\\\fi--didenas1\\Malaria"), + cmp <- cbind(remote = c("\\\\projects\\other", + "\\\\qdrive\\homes\\bob", + "\\\\wpia-hn\\Malaria"), local = paths) expect_equal(res, cmp) }) @@ -100,17 +100,17 @@ test_that("Warn if given unexpected output (linux)", { paths <- file.path(tmp, c("other", "home", "malaria")) fs::dir_create(paths) dat <- c( - "//fi--didef3/other on %s/other type cifs (rw,relatime)", - "//fi--san03/homes/bob sur %s/home type cifs (rw,relatime)", - "//fi--didenas1/Malaria on %s/malaria type cifs (rw,relatime)") + "//projects/other on %s/other type cifs (rw,relatime)", + "//qdrive/homes/bob sur %s/home type cifs (rw,relatime)", + "//wpia-hn/Malaria on %s/malaria type cifs (rw,relatime)") dat <- vcapply(dat, function(x) sprintf(x, tmp), USE.NAMES = FALSE) mock_system2 <- mockery::mock(dat) mockery::stub(detect_mounts_unix, "system2", mock_system2) expect_warning( res <- detect_mounts_unix(), "Ignoring mounts") - cmp <- cbind(remote = c("\\\\fi--didef3\\other", - "\\\\fi--didenas1\\Malaria"), + cmp <- cbind(remote = c("\\\\projects\\other", + "\\\\wpia-hn\\Malaria"), local = paths[-2]) expect_equal(res, cmp) }) @@ -119,11 +119,11 @@ test_that("Warn if given unexpected output (linux)", { test_that("Can parse wmic output", { x <- c("\r", "Node,ConnectionState,LocalName,RemoteName,Status\r", - "BUILDERHV,Connected,q:,\\\\fi--san03\\homes\\bob,OK\r", - "BUILDERHV,Connected,T:,\\\\fi--didef3\\tmp,OK\r") + "BUILDERHV,Connected,q:,\\\\qdrive\\homes\\bob,OK\r", + "BUILDERHV,Connected,T:,\\\\projects\\tmp,OK\r") expect_equal( wmic_parse(x), - cbind(remote = c("\\\\fi--san03\\homes\\bob", "\\\\fi--didef3\\tmp"), + cbind(remote = c("\\\\qdrive\\homes\\bob", "\\\\projects\\tmp"), local = c("q:", "T:"))) }) @@ -131,11 +131,11 @@ test_that("Can parse wmic output", { test_that("Ignore disconnected mounts", { x <- c("\r", "Node,ConnectionState,LocalName,RemoteName,Status\r", - "BUILDERHV,Connected,q:,\\\\fi--san03\\homes\\bob,OK\r", - "BROKEN,Disconnected,T:,\\\\fi--didef3\\broken,Degraded\r") + "BUILDERHV,Connected,q:,\\\\qdrive\\homes\\bob,OK\r", + "BROKEN,Disconnected,T:,\\\\projects\\broken,Degraded\r") expect_equal( wmic_parse(x), - cbind(remote = c("\\\\fi--san03\\homes\\bob"), + cbind(remote = c("\\\\qdrive\\homes\\bob"), local = c("q:"))) }) @@ -143,8 +143,8 @@ test_that("Ignore disconnected mounts", { test_that("Can validate wmic output", { x <- c("\r", "node,connectionstate,localname,remotename,status\r", - "BUILDERHV,Connected,q:,\\\\fi--san03\\homes\\bob,OK\r", - "BUILDERHV,Connected,T:,\\\\fi--didef3\\tmp,OK\r") + "BUILDERHV,Connected,q:,\\\\qdrive\\homes\\bob,OK\r", + "BUILDERHV,Connected,T:,\\\\projects\\tmp,OK\r") expect_error( wmic_parse(x), "Failed to find expected names in wmic output: RemoteName, LocalName") @@ -191,8 +191,8 @@ test_that("wmic_call copes with command and parse errors", { res_bad <- "lolno" res_good <- c("\r", "Node,ConnectionState,LocalName,RemoteName,Status\r", - "BUILDERHV,Connected,q:,\\\\fi--san03\\homes\\bob,OK\r", - "BUILDERHV,Connected,T:,\\\\fi--didef3\\tmp,OK\r") + "BUILDERHV,Connected,q:,\\\\qdrive\\homes\\bob,OK\r", + "BUILDERHV,Connected,T:,\\\\projects\\tmp,OK\r") mock_system <- mockery::mock(stop("Error running command"), res_bad, res_good) mockery::stub(wmic_call, "system_intern_check", mock_system) @@ -286,19 +286,9 @@ test_that("Remap nas regex - South Ken", { }) -test_that("Check nas regex won't map cross-campus", { +test_that("Check app not used for non-infini shared", { expect_equal(use_app_on_nas_south_ken( - "\\\\fi--didenas1.dide.ic.ac.uk\\X"), "\\\\fi--didenas1.dide.ic.ac.uk\\X") - expect_equal(use_app_on_nas_south_ken( - "//fi--didenas3.dide.ic.ac.uk/X"), "//fi--didenas3.dide.ic.ac.uk/X") - expect_equal(use_app_on_nas_south_ken( - "\\\\fi--didenas4\\X"), "\\\\fi--didenas4\\X") - expect_equal(use_app_on_nas_south_ken( - "//fi--didenas5/X"), "//fi--didenas5/X") - expect_equal(use_app_on_nas_south_ken( - "\\\\fi--didenas1.dide.local\\X"), "\\\\fi--didenas1.dide.local\\X") - expect_equal(use_app_on_nas_south_ken( - "//fi--didenas3.dide.local/X"), "//fi--didenas3.dide.local/X") + "\\\\qdrive.dide.ic.ac.uk\\X"), "\\\\qdrive.dide.ic.ac.uk\\X") }) diff --git a/drivers/windows/tests/testthat/test-paths.R b/drivers/windows/tests/testthat/test-paths.R index 85d5b0a4..5f782ea1 100644 --- a/drivers/windows/tests/testthat/test-paths.R +++ b/drivers/windows/tests/testthat/test-paths.R @@ -1,6 +1,6 @@ test_that("can create a path mapping", { p <- getwd() - m <- windows_path(p, "//fi--san03/homes/bob", "Q:") + m <- windows_path(p, "//qdrive/homes/bob", "Q:") expect_s3_class(m, "windows_path") str <- as.character(m) expect_match(str, "\\(local\\) .+ => .+ \\(remote\\)") @@ -9,33 +9,33 @@ test_that("can create a path mapping", { test_that("cannot create a path mapping on I:", { p <- getwd() - expect_error(windows_path(p, "//fi--san03/homes/bob", "I:"), + expect_error(windows_path(p, "//qdrive/homes/bob", "I:"), "You cannot use I:") }) test_that("can validate creation of path mapping", { expect_error( - windows_path(tempfile(), "//fi--san03/homes/bob", "Q:"), + windows_path(tempfile(), "//qdrive/homes/bob", "Q:"), "Local mount point does not exist.") expect_error( - windows_path("Q:", "Q://fi--san03/homes/bob", "Q:"), + windows_path("Q:", "Q://qdrive/homes/bob", "Q:"), "path_remote must be a network path") expect_error( - windows_path(getwd(), "//fi--san03/homes/bob", "Q"), + windows_path(getwd(), "//qdrive/homes/bob", "Q"), "drive_remote must be of the form 'X:'") }) test_that("Can clean a remote path", { expect_equal( - clean_path_remote("//fi--san03/homes/bob"), - "\\\\fi--san03.dide.ic.ac.uk\\homes\\bob") + clean_path_remote("//qdrive/homes/bob"), + "\\\\qdrive.dide.ic.ac.uk\\homes\\bob") expect_equal( - clean_path_remote("//fi--san03.dide.local/homes/bob"), - "\\\\fi--san03.dide.ic.ac.uk\\homes\\bob") + clean_path_remote("//qdrive.dide.local/homes/bob"), + "\\\\qdrive.dide.ic.ac.uk\\homes\\bob") expect_equal( - clean_path_remote("//fi--san03.dide.ic.ac.uk/homes/bob/"), - "\\\\fi--san03.dide.ic.ac.uk\\homes\\bob") + clean_path_remote("//qdrive.dide.ic.ac.uk/homes/bob/"), + "\\\\qdrive.dide.ic.ac.uk\\homes\\bob") }) @@ -62,8 +62,8 @@ test_that("Can detect a path into a share", { t <- withr::local_tempdir() t <- normalize_path(t) shares <- list( - windows_path(p, "//fi--san03/homes/bob", "Q:"), - windows_path(tempdir(), "//fi--san03/tmp", "T:")) + windows_path(p, "//qdrive/homes/bob", "Q:"), + windows_path(tempdir(), "//qdrive/tmp", "T:")) x <- prepare_path(t, shares) expect_equal(x$rel, basename(t)) @@ -95,8 +95,8 @@ test_that("Can create a remote path", { t <- withr::local_tempdir() t <- normalize_path(t) shares <- list( - home = windows_path(p, "//fi--san03/homes/bob", "Q:"), - temp = windows_path(tempdir(), "//fi--san03/tmp", "T:")) + home = windows_path(p, "//qdrive/homes/bob", "Q:"), + temp = windows_path(tempdir(), "//qdrive/tmp", "T:")) res <- remote_path(t, shares) expect_equal(res, paste0("T:/", basename(t))) diff --git a/drivers/windows/tests/testthat/test-web-format.R b/drivers/windows/tests/testthat/test-web-format.R index 6f78dbb0..979cafcc 100644 --- a/drivers/windows/tests/testthat/test-web-format.R +++ b/drivers/windows/tests/testthat/test-web-format.R @@ -1,25 +1,25 @@ test_that("Can format the overall load", { - x <- list(cluster = "didehpc", + x <- list(cluster = "hipercow", detail = NULL, summary = data.frame( - name = c("fi--dideclusthn", "fi--didemrchnb"), + name = c("wpia-hn", "wpia-hn2"), free = c(203, 850), used = c(13, 930), total = c(216, 1780), percent_used = c(6, 52), stringsAsFactors = FALSE), - overall = list(name = "didehpc", + overall = list(name = "hipercow", free = 1053, used = 943, total = 1996, percent_used = 47)) class(x) <- "dide_clusterload" - expected <- c(" name free used total % used", - "--------------- ---- ---- ----- ------", - "fi--dideclusthn 203 13 216 6%", - " fi--didemrchnb 850 930 1780 52%", - "--------------- ---- ---- ----- ------", - " didehpc 1053 943 1996 47%") + expected <- c(" name free used total % used", + "-------- ---- ---- ----- ------", + " wpia-hn 203 13 216 6%", + "wpia-hn2 850 930 1780 52%", + "-------- ---- ---- ----- ------", + "hipercow 1053 943 1996 47%") str <- withr::with_options(list(crayon.enabled = FALSE), format(x)) expect_equal(str, expected) diff --git a/drivers/windows/tests/testthat/test-web.R b/drivers/windows/tests/testthat/test-web.R index 33369d97..cc016181 100644 --- a/drivers/windows/tests/testthat/test-web.R +++ b/drivers/windows/tests/testthat/test-web.R @@ -242,7 +242,7 @@ test_that("submit sends correct payload", { resources <- list( cores = 1, exclusive = FALSE, - queue = "GeneralNodes") + queue = "AllNodes") expect_equal( cl$submit(path, "name", resources = resources, @@ -256,14 +256,14 @@ test_that("submit sends correct payload", { c("123", "456")))) expect_equal( - cl$submit(path, "name", resources, "fi--didemrchnb", + cl$submit(path, "name", resources, "wpia-hn", depends_on = character()), dide_id) mockery::expect_called(mock_client$POST, 2L) expect_equal( mockery::mock_args(mock_client$POST)[[2]], list("/submit_1.php", - client_body_submit(path, "name", resources, "fi--didemrchnb", + client_body_submit(path, "name", resources, "wpia-hn", character()))) }) @@ -372,14 +372,14 @@ test_that("status job sends correct payload", { r <- mock_response(200, content = "Running") mock_client <- list(GET = mockery::mock(r)) cl <- web_client$new(login = FALSE, client = mock_client) - expect_equal(cl$status_job(dide_id, "fi--didemrchnb"), + expect_equal(cl$status_job(dide_id, "wpia-hn"), "running") mockery::expect_called(mock_client$GET, 1L) expect_equal( mockery::mock_args(mock_client$GET)[[1]], list("/api/v1/get_job_status/", - query = list(scheduler = "fi--didemrchnb", + query = list(scheduler = "wpia-hn", jobid = dide_id))) }) diff --git a/man/windows_path.Rd b/man/windows_path.Rd index 9b8a6ff3..209628ec 100644 --- a/man/windows_path.Rd +++ b/man/windows_path.Rd @@ -14,13 +14,13 @@ all, depending on what you used when you mounted it (or what is written in \verb{/etc/fstab})} \item{path_remote}{The network path for this drive. It -will look something like \verb{\\\\\\\\fi--didef3.dide.ic.ac.uk\\\\tmp\\\\}. +will look something like \verb{\\\\\\\\projects.dide.ic.ac.uk\\\\tmp\\\\}. Unfortunately backslashes are really hard to get right here and you will need to use twice as many as you expect (so \emph{four} backslashes at the beginning and then two for each separator). If this makes you feel bad know that you are not alone: https://xkcd.com/1638 -- alternatively you may use forward -slashes in place of backslashes (e.g. \verb{//fi--didef3.dide.ic.ac.uk/tmp})} +slashes in place of backslashes (e.g. \verb{//projects.dide.ic.ac.uk/tmp})} \item{drive_remote}{The place to mount the drive on the cluster. We're probably going to mount things at Q: and T: already so @@ -40,7 +40,7 @@ Describe a path mapping for use when setting up jobs on the cluster. # this as "M:" when running tasks by first creating a path # mapping: share <- windows_path("~/net/malaria", - "//fi--didenas1.dide.ic.ac.uk/Malaria", + "//wpia-hn.hpc.dide.ic.ac.uk/Malaria", "M:") # This share object contains information about how to relate your diff --git a/tests/testthat/test-windows.R b/tests/testthat/test-windows.R index fffc368f..9d7ebba5 100644 --- a/tests/testthat/test-windows.R +++ b/tests/testthat/test-windows.R @@ -3,7 +3,7 @@ test_that("windows_path calls hipercow.windows", { mock_ensure_package <- mockery::mock(mock_pkg) mockery::stub(windows_path, "ensure_package", mock_ensure_package) p <- getwd() - windows_path(p, "//fi--san03/homes/bob", "Q:") + windows_path(p, "//qdrive/homes/bob", "Q:") mockery::expect_called(mock_ensure_package, 1) args <- mockery::mock_args(mock_ensure_package)[[1]] @@ -13,7 +13,7 @@ test_that("windows_path calls hipercow.windows", { mockery::expect_called(mock_pkg$windows_path, 1) args <- mockery::mock_args(mock_pkg$windows_path)[[1]] expect_equal(args[[1]], p) - expect_equal(args[[2]], "//fi--san03/homes/bob") + expect_equal(args[[2]], "//qdrive/homes/bob") expect_equal(args[[3]], "Q:") expect_type(args[[4]], "environment") }) diff --git a/vignettes/administration.Rmd b/vignettes/administration.Rmd index 95be46a5..d660feab 100644 --- a/vignettes/administration.Rmd +++ b/vignettes/administration.Rmd @@ -98,7 +98,7 @@ We have batch files specific for each version of R that we support which:- * Set the necessary environmental variables for a matching version of RTools, such as `RTOOLS43_HOME` and `BINPREF`. * Set the environment variable `JAVA_HOME` which the `rJava` package looks up. -These batch files live in `\\fi--didef3.dide.ic.ac.uk\software\hpc\R`, and are called things like `setr64_4_3_2.bat`, which looks like this. +These batch files live in `\\projects.dide.ic.ac.uk\software\hpc\R`, and are called things like `setr64_4_3_2.bat`, which looks like this. ``` @echo off @@ -122,7 +122,7 @@ This also needs doing (manually) on the headnode, which runs the BuildQueue. ## Adding R Versions -* Download the new R version into `\\fi--didef3\software\hpc\R`. +* Download the new R version into `\\projects\software\hpc\R`. * Copy the most recent `install_r_....bat` file, to a name matching the new R version. Edit it; usually just changing the R_VERSION near the top is enough. * Copy the most recent `setr64_...bat` file, to a name matching the new R version. Usually just the path is enough, but for major versions, we'll need to consult the documentation and see if we need a new RTools version too. * Run the new `install` batch file on all cluster nodes. diff --git a/vignettes/windows.Rmd b/vignettes/windows.Rmd index 23ed9523..4d9feccf 100644 --- a/vignettes/windows.Rmd +++ b/vignettes/windows.Rmd @@ -117,7 +117,7 @@ Below, instructions for setting up depend on the sort of computer you are typing If you are using a windows machine in the DIDE domain, then your network drives are likely already mapped for you. In fact you should not even need to map drives as fully qualified network names -(e.g. `//fi--didef3/tmp`) should work for you. +(e.g. `//projects/tmp`) should work for you. ### macOS @@ -126,7 +126,7 @@ In the address field write the name of the share you want to connect to. You will likely want to mount: ``` -smb://fi--san03.dide.ic.ac.uk/homes/ +smb://qdrive.dide.ic.ac.uk/homes/ ``` which is your home share. @@ -150,7 +150,7 @@ sudo apt-get install cifs-utils In your `/etc/fstab` file, add ``` -//fi--san03.dide.ic.ac.uk/homes/ cifs uid=,gid=,credentials=/home//.smbcredentials,domain=DIDE,sec=ntlmssp,iocharset=utf8 0 0 +//qdrive.dide.ic.ac.uk/homes/ cifs uid=,gid=,credentials=/home//.smbcredentials,domain=DIDE,sec=ntlmssp,iocharset=utf8 0 0 ``` where: @@ -166,7 +166,7 @@ where: So for example, I have: ``` -//fi--san03.dide.ic.ac.uk/homes/rfitzjoh /home/rich/net/home cifs uid=1000,gid=1000,credentials=/home/rich/.smbcredentials,domain=DIDE,sec=ntlmssp,iocharset=utf8 0 0 +//qdrive.dide.ic.ac.uk/homes/rfitzjoh /home/rich/net/home cifs uid=1000,gid=1000,credentials=/home/rich/.smbcredentials,domain=DIDE,sec=ntlmssp,iocharset=utf8 0 0 ``` The file `.smbcredentials` contains @@ -196,7 +196,7 @@ don't have to do this until you get a new computer. If you are on a laptop that will not regularly be connected to the internal network, you might want to add the option `noauto` to the above ``` -//fi--san03.dide.ic.ac.uk/homes/rfitzjoh /home/rich/net/home cifs uid=1000,gid=1000,credentials=/home/rich/.smbcredentials,domain=DIDE,sec=ntlmssp,iocharset=utf8,noauto 0 0 +//qdrive.dide.ic.ac.uk/homes/rfitzjoh /home/rich/net/home cifs uid=1000,gid=1000,credentials=/home/rich/.smbcredentials,domain=DIDE,sec=ntlmssp,iocharset=utf8,noauto 0 0 ``` and then explicitly mount the drive as required with @@ -314,7 +314,7 @@ hipercow_configuration() #> ── windows #> • cluster: wpia-hn #> • shares: 1 configured: -#> → (local) /home/rfitzjoh/net/home => \\fi--san03.dide.ic.ac.uk\homes\rfitzjoh => V: (remote) +#> → (local) /home/rfitzjoh/net/home => \\qdrive.dide.ic.ac.uk\homes\rfitzjoh => V: (remote) #> • r_version: 4.4.0 #> • path_lib: hipercow/lib/windows/4.4.0 #> • username: rfitzjoh diff --git a/vignettes_src/windows.Rmd b/vignettes_src/windows.Rmd index 0f7886b6..39c4d7d3 100644 --- a/vignettes_src/windows.Rmd +++ b/vignettes_src/windows.Rmd @@ -123,7 +123,7 @@ Below, instructions for setting up depend on the sort of computer you are typing If you are using a windows machine in the DIDE domain, then your network drives are likely already mapped for you. In fact you should not even need to map drives as fully qualified network names -(e.g. `//fi--didef3/tmp`) should work for you. +(e.g. `//projects/tmp`) should work for you. ### macOS @@ -132,7 +132,7 @@ In the address field write the name of the share you want to connect to. You will likely want to mount: ``` -smb://fi--san03.dide.ic.ac.uk/homes/ +smb://qdrive.dide.ic.ac.uk/homes/ ``` which is your home share. @@ -156,7 +156,7 @@ sudo apt-get install cifs-utils In your `/etc/fstab` file, add ``` -//fi--san03.dide.ic.ac.uk/homes/ cifs uid=,gid=,credentials=/home//.smbcredentials,domain=DIDE,sec=ntlmssp,iocharset=utf8 0 0 +//qdrive.dide.ic.ac.uk/homes/ cifs uid=,gid=,credentials=/home//.smbcredentials,domain=DIDE,sec=ntlmssp,iocharset=utf8 0 0 ``` where: @@ -172,7 +172,7 @@ where: So for example, I have: ``` -//fi--san03.dide.ic.ac.uk/homes/rfitzjoh /home/rich/net/home cifs uid=1000,gid=1000,credentials=/home/rich/.smbcredentials,domain=DIDE,sec=ntlmssp,iocharset=utf8 0 0 +//qdrive.dide.ic.ac.uk/homes/rfitzjoh /home/rich/net/home cifs uid=1000,gid=1000,credentials=/home/rich/.smbcredentials,domain=DIDE,sec=ntlmssp,iocharset=utf8 0 0 ``` The file `.smbcredentials` contains @@ -202,7 +202,7 @@ don't have to do this until you get a new computer. If you are on a laptop that will not regularly be connected to the internal network, you might want to add the option `noauto` to the above ``` -//fi--san03.dide.ic.ac.uk/homes/rfitzjoh /home/rich/net/home cifs uid=1000,gid=1000,credentials=/home/rich/.smbcredentials,domain=DIDE,sec=ntlmssp,iocharset=utf8,noauto 0 0 +//qdrive.dide.ic.ac.uk/homes/rfitzjoh /home/rich/net/home cifs uid=1000,gid=1000,credentials=/home/rich/.smbcredentials,domain=DIDE,sec=ntlmssp,iocharset=utf8,noauto 0 0 ``` and then explicitly mount the drive as required with