Skip to content

Commit

Permalink
Package import fix
Browse files Browse the repository at this point in the history
  • Loading branch information
dipterix committed Dec 17, 2024
1 parent 51429dd commit e04a6c0
Show file tree
Hide file tree
Showing 5 changed files with 5 additions and 5 deletions.
2 changes: 1 addition & 1 deletion NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -161,7 +161,6 @@ export(updateActionButtonStyled)
export(updateCompoundInput2)
export(use_shiny_dipsaus)
export(write_json)
import(shiny)
importFrom(R6,R6Class)
importFrom(Rcpp,sourceCpp)
importFrom(cli,ansi_strip)
Expand All @@ -183,5 +182,6 @@ importFrom(rlang,cnd_entrace)
importFrom(rlang,entrace)
importFrom(rlang,error_cnd)
importFrom(rlang,trace_back)
importFrom(shiny,actionButton)
importFrom(utils,flush.console)
useDynLib(dipsaus, .registration = TRUE)
2 changes: 1 addition & 1 deletion R/aaa.R
Original file line number Diff line number Diff line change
@@ -1,4 +1,4 @@
#' @import shiny
#' @importFrom shiny actionButton
#' @importFrom Rcpp sourceCpp
#' @importFrom R6 R6Class
#' @importFrom fastmap fastmap
Expand Down
2 changes: 1 addition & 1 deletion R/parallels-apply-script.R
Original file line number Diff line number Diff line change
Expand Up @@ -145,7 +145,7 @@ lapply_callr <- function(

h <- rs_exec(bquote({
if( dir.exists(.(getwd()))){
setwd(.(getwd()))
do.call("setwd", list(.(getwd())))
}

.env <- new.env(parent = globalenv())
Expand Down
2 changes: 1 addition & 1 deletion R/parallels-future.R
Original file line number Diff line number Diff line change
Expand Up @@ -288,7 +288,7 @@ lapply_async2 <- function(x, FUN, FUN.args = list(),
fs <- lapply(x, f)
}

p("Results collected\n")
...p("Results collected\n")

# fs <- future.apply::future_lapply(x, function(el) {
# p(message = eval(callback_call))
Expand Down
2 changes: 1 addition & 1 deletion R/shiny-syncInputs.R
Original file line number Diff line number Diff line change
Expand Up @@ -46,7 +46,7 @@ sync_shiny_inputs <- function(input, session, inputIds,
val = NULL
)

local_data <- reactiveValues(
local_data <- shiny::reactiveValues(
last_changed = Sys.time(),
last_updated = Sys.time()
)
Expand Down

0 comments on commit e04a6c0

Please sign in to comment.