inst/shiny/surfaceexposure/global.R

## global.R ##
library(Luminescence)
library(RLumShiny)
library(shiny)
library(data.table)
library(rhandsontable)

data("ExampleData.SurfaceExposure")
tmp <- Map(function(x, i) {
  x$error <- 0.001
  x$group <- i
  return(x)
}, ExampleData.SurfaceExposure$set_1, LETTERS[1:4])

example_data <- do.call(rbind, tmp)
rm(tmp)

enableBookmarking(store = "server")

Try the RLumShiny package in your browser

Any scripts or data that you put into this service are public.

RLumShiny documentation built on Jan. 31, 2022, 9:07 a.m.