TPP error message " The names of the data objects in 'data' differ from the names given in the Experiment column of 'configTable'."
0
0
Entering edit mode
kkim369 • 0
@kkim369-19409
Last seen 5.3 years ago

Hi,

I’m struggling with the following error message while I’m using TPP package.

This is TPP version 3.10.1.
Importing data...

Comparisons will be performed between the following experiments:
T_1_vs_Vehicle_1
T_2_vs_Vehicle_2


The following valid label columns were detected:
126, 127L, 127H, 128L, 128H, 129L, 129H, 130L, 130H, 131L.
Error in importCheckExperimentNames(expNames = expNames, dataframes = data) : 
  The names of the data objects in 'data' differ from the names given 
           in the Experiment column of 'configTable'.

The format of my configuration and data files is exactly the same as the example files (I just replaced numbers), and they look like the below.

  1. Configuration file (.xml) configuration

  2. Data file (.txt) data

And I used the code below to run TPP package.

library("TPP")

setwd("C:/Users/kt_ki/Documents/R/win-library/3.5/TPP/example_data/TR_example_data/FQ")

library(readxl)
TTR_config <- read_excel("TTR_config.xlsx", 
                          col_types = c("text", "text", "text", 
                                        "text", "numeric", "numeric", "numeric", 
                                        "numeric", "numeric", "numeric", 
                                        "numeric", "numeric", "numeric", 
                                        "numeric", "text"))
View(TTR_config)

T_1 <- read.delim("~/R/win-library/3.5/TPP/example_data/TR_example_data/FQ/T_1.txt", stringsAsFactors=FALSE)
View(T_1)
T_2 <- read.delim("~/R/win-library/3.5/TPP/example_data/TR_example_data/FQ/T_2.txt", stringsAsFactors=FALSE)
View(T_2)
Vehicle_1 <- read.delim("~/R/win-library/3.5/TPP/example_data/TR_example_data/FQ/Vehicle_1.txt", stringsAsFactors=FALSE)
View(Vehicle_1)
Vehicle_2 <- read.delim("~/R/win-library/3.5/TPP/example_data/TR_example_data/FQ/Vehicle_2.txt", stringsAsFactors=FALSE)
View(Vehicle_2)

TTR_data <- list(T_1, T_2, Vehicle_1, Vehicle_2)
names(TTR_data) <- c("T_1", "T_2", "Vehicle_1", "Vehicle_2")

resultPath = file.path(getwd(), 'T_Example')

TRresults <- analyzeTPPTR(configTable = TTR_config,
                          methods = "meltcurvefit",
                          data = TTR_data,
                          nCores = 2,
                          resultPath = resultPath,
                          plotCurves = FALSE)

Has anyone experienced the same issue with me? At first, I thought I needed to change the labels in configuration file to the labels in data file (i.e.. 126 to relfc126, 127L to relfc127L, ...), but it didn't work either.

I would greatly appreciate it if somebody could help me with this problem.

Thank you in advance, Kyoungtea


Also, as per the posting guide, I also include the information below.

> sessionInfo() 
R version 3.5.2 (2018-12-20)
Platform: x86_64-w64-mingw32/x64 (64-bit)
Running under: Windows >= 8 x64 (build 9200)

Matrix products: default

locale:
[1] LC_COLLATE=English_United States.1252  LC_CTYPE=English_United States.1252    LC_MONETARY=English_United States.1252
[4] LC_NUMERIC=C                           LC_TIME=English_United States.1252    

attached base packages:
[1] parallel  stats     graphics  grDevices utils     datasets  methods   base     

other attached packages:
[1] TPP_3.10.1          tidyr_0.8.2         magrittr_1.5        dplyr_0.7.8         Biobase_2.42.0     
[6] BiocGenerics_0.28.0

loaded via a namespace (and not attached):
 [1] tidyselect_0.2.5     xfun_0.4             purrr_0.2.5          reshape2_1.4.3       lattice_0.20-38     
 [6] splines_3.5.2        colorspace_1.3-2     htmltools_0.3.6      stats4_3.5.2         yaml_2.2.0          
[11] rlang_0.3.1          pillar_1.3.1         glue_1.3.0           RColorBrewer_1.1-2   lambda.r_1.2.3      
[16] bindrcpp_0.2.2       foreach_1.4.4        bindr_0.1.1          plyr_1.8.4           stringr_1.3.1       
[21] munsell_0.5.0        gtable_0.2.0         futile.logger_1.4.3  zip_1.0.0            codetools_0.2-15    
[26] VGAM_1.0-6           evaluate_0.12        knitr_1.21           doParallel_1.0.14    Rcpp_1.0.0          
[31] scales_1.0.0         formatR_1.5          limma_3.38.3         gridExtra_2.3        ggplot2_3.1.0       
[36] digest_0.6.18        stringi_1.2.4        openxlsx_4.1.0       grid_3.5.2           nls2_0.2            
[41] bitops_1.0-6         tools_3.5.2          RCurl_1.95-4.11      lazyeval_0.2.1       tibble_1.4.2        
[46] futile.options_1.0.1 sme_1.0.2            crayon_1.3.4         pkgconfig_2.0.2      MASS_7.3-51.1       
[51] data.table_1.11.8    assertthat_0.2.0     rmarkdown_1.11       rstudioapi_0.9.0     iterators_1.0.10    
[56] R6_2.3.0             VennDiagram_1.6.20   compiler_3.5.2      
>

software error TPP • 629 views
ADD COMMENT

Login before adding your answer.

Traffic: 971 users visited in the last hour
Help About
FAQ
Access RSS
API
Stats

Use of this site constitutes acceptance of our User Agreement and Privacy Policy.

Powered by the version 2.3.6