1

我无法上传和显示带有 R 中闪亮库的 rda 文件。有人知道该怎么做吗?我使用 R 版本 3.1.1。这是使用闪亮的网站: http: //shiny.rstudio.com

**

#ui.R
library(shiny)
shinyUI(navbarPage("MareyMap online",

                   tabPanel("Présentation",

h2("A web-service for estimating recombination rates along the genome",align="center"),

br()

),

tabPanel("Step 1 : Data Selection",


         fileInput("file", label = h3("or upload a data set")),
                         'Note: Upload the marey map data for your species using the following format: txt, rda,
Rda, rdata or Rdata.',

        "Optional -- Would you agree to include your dataset in our database after data curation",

         tableOutput("table")

         )
))
#server.R
library(shiny)
library(MareyMap)
shinyServer(function(input, output) {

  output$table <- renderPrint({
    input$file
  })  
})

**

4

1 回答 1

0

它不起作用,但最后我尝试使用 .txt 文件:

“set” “map” “mkr” “phys” “gen” “vld” “Arabidopsis thaliana” “染色体 1” “SGCSNP131” 184351 0 TRUE “Arabidopsis thaliana” “染色体 1” “SGCSNP5” 189722 2.61 TRUE “Arabidopsis thaliana” “染色体 1” “SGCSNP247” 662031 2.54 正确 “拟南芥” “染色体 1” “GST1” 663291 3.99 正确 “拟南芥” “染色体 1” “SGCSNP151” 1148355 3.35 正确 “拟南芥” “染色体 1” “14358 72”AtEAT 3.87 正确的“拟南芥”“染色体 1”“ve002”1521308 7.15 正确的“拟南芥”“染色体 1”“SGCSNP388”1526933 7.66 TRUE "Arabidopsis thaliana" "染色体 1" "SGCSNP170" 1642565 7.66 TRUE "Arabidopsis thaliana" "染色体 1" "ve003" 2032443 7.76 TRUE "Arabidopsis thaliana" "染色体 1" "SGCSNP308" 2664435 0.89 "Chromosome Apsiidosthalias 1" "phyA" 3097714 11.35 TRUE "Arabidopsis thaliana" "染色体 1" "SGCSNP107" 3097951 11.86 TRUE "Arabidopsis thaliana" "染色体 1" "SGCSNP138" 3121108 14.69 TRUE "Arabidopsis thaliana" "染色体 1923""CS319060" "拟南芥" "染色体 1" "ve005" 3194953 11.48 TRUE "拟南芥" "染色体 1" "nga63"3224435 11.48 真“拟南芥”“染色体 1”“ARR4” 3443848 11.35 真“拟南芥”“染色体 1”“SGCSNP148”3658292 11.99 真“拟南芥”“染色体 1”“BFN1”377342 真“拟南芥”377342染色体 1" "NCC1" 4107626 12.6 正确 "拟南芥" "染色体 1" "ve006" 4459553 16.13 正确 "拟南芥" "染色体 1" "SGCSNP132" 4588103 14.04 正确 ...染色体 1" "BFN1" 3773426 11.98 TRUE "Arabidopsis thaliana" "染色体 1" "NCC1" 4107626 12.6 TRUE "Arabidopsis thaliana" "染色体 1" "ve006" 4459553 16.13 TRUE "Arabidopsis thaliana" "Arabidopsis thaliana" "Chromosome 1" "13.204518" 12.6 TRUE真的 ...染色体 1" "BFN1" 3773426 11.98 TRUE "Arabidopsis thaliana" "染色体 1" "NCC1" 4107626 12.6 TRUE "Arabidopsis thaliana" "染色体 1" "ve006" 4459553 16.13 TRUE "Arabidopsis thaliana" "Arabidopsis thaliana" "Chromosome 1" "13.204518" 12.6 TRUE真的 ...

服务器.R

图书馆(闪亮) 图书馆(MareyMap)

闪亮服务器(功能(输入,输出){

输出$表 <- 渲染打印({

#data(Arabidopsis_thalianan)
#Arabidopsis_thalianan@maps  

})

输出$table2 <- 渲染表({

inFile <- input$file

if (is.null(inFile))
  return(NULL)

read.csv(inFile$datapath, header = TRUE,
         sep = ' ', quote ='"')

})

输出$table3 <- 渲染表({

inFile <- input$file

if (is.null(inFile))
  return(NULL)

a<-read.csv(inFile$datapath, header = TRUE,
         sep = ' ', quote ='"')
a[,"map"]

})

})

用户界面

图书馆(闪亮)

shinyUI(navbarPage("MareyMap 在线",

               tabPanel("Présentation",
                        
                        h2("A web-service for estimating recombination rates along the genome",align="center"),
                        
                        
                        br(),
                        
                        helpText("MareyMap allows to estimate local recombination rates along the genome. MareyMap relies on
                                 comparing the genetic and the physical maps of a given chromosome to estimate local recombination
                                 rates (given by the slope of the curve describing the relationship between both variables), a graphical
                                 method called the Marey map method introduced by A. Chakravarti in 1991 . MareyMap accepts Marey
                                 map data as input (genetic and physical positions of markers for a set of chromosomes of a species) and
                                 will return local recombination rate estimates.")
                        ),
               
               
               
               tabPanel("Step 1 : Data Selection",
                        
                        selectInput("dataset", label = h3("Select a dataset in our database",align="center"),
                                    choices = c("Arabidopsis_thalianan", "Caenorhabditis_elegans" ,
                                                "Drosophila melanogaster","Homo sapiens")),
                        
                        fileInput("file", label = h3("or upload a data set")),
                        'Note: Upload the marey map data for your species using the following format: txt',
                        
                        br(),
                        br(),
                        
                        "Optional -- Would you agree to include your dataset in our database after data curation",
                        
                        textOutput("table"),
                        tableOutput("table2")
                        
                        
               ),
               tabPanel("Step 2 : Data curation",
                        "list of chromosomes:",
                        br(),
                        tableOutput("table3")
               ),
               tabPanel("Step 3 : Interpolation"),
               tabPanel("Step 4 : Rec Rates export")
                        ))

但我不能只显示地图列。

于 2015-03-16T09:44:04.327 回答