如何使libcurl只安装共享库

时间:2016-02-15 14:11:47

标签: linux curl libcurl

我用autoconf构建libcurl。

我想让libcurl只安装共享库(.so)。

我不希望安装副本libcurl.a既不是curl命令也不配置man和其他文件。

1 个答案:

答案 0 :(得分:1)

我的建议是首先将整个地块安装在临时位置,然后将所需的特定文件移动到正确的最终目的地。

像这样:

library(shiny)
library(som)
shinyUI(pageWithSidebar(

  headerPanel("Dataset Selection"),

  sidebarPanel(
     actionButton("Gobutton", "Bring it up")
  ),
  mainPanel(
   wellPanel(
               fluidRow(
                 column(8, uiOutput("dataTable")
                        ))
   ),
   wellPanel(
               fluidRow(
                 column(8,plotOutput("preprocessData")
                       )),
               conditionalPanel(condition = "input.NormalizeButton <= 0",
                                actionButton("NormalizeButton","Normalize")),
               conditionalPanel(condition = "input.LogTransformButton <= 0",
                                actionButton("LogTransformButton", "Log2 Transform"))

  )
  )
)
)

然后从normalizeSom <- function(GSEmRNA){ colnamesSAVE <- colnames(GSEmRNA) GSEmRNA <- som::normalize(GSEmRNA) # Normalize the dataset using som package of R colnames(GSEmRNA) <- colnamesSAVE return(GSEmRNA) } todoLogTransformation <- function(GSEmRNA) { GSEmRNA <- log(GSEmRNA,2) return(GSEmRNA) } shinyServer(function(input, output) { library(xtable) # You can access the value of the widget with input$num, e.g. GSEmRNA <- data.frame(from=c(100,200,150), to=c(1000,2000,150),last= c(50,50,250)) data_for_use=reactiveValues(d=GSEmRNA) output$dataTable <- renderUI({ if (input$Gobutton== 0) {return()} else{ GSEmRNAprinted <- print(xtable(head(data_for_use$d), align=rep("c", ncol(data_for_use$d)+1)), floating=FALSE, tabular.environment="array", comment=FALSE, print.results=FALSE) html <- paste0("$$", GSEmRNAprinted, "$$") list( withMathJax(HTML(html)))} }) output$preprocessData <- renderPlot({ if (input$Gobutton== 0) {return() }else{ boxplot(data_for_use$d) } }) observeEvent(input$NormalizeButton,{ data_for_use$d=normalizeSom(data_for_use$d) }) observeEvent(input$LogTransformButton,{ data_for_use$d=todoLogTransformation(data_for_use$d) }) }) 树中选择所需的文件。

或者,您首先构建所有内容(可能使用$ ./configure $ make $ make DESTDIR=/tmp/temp-install install 跳过静态库),然后仅在lib目录中运行/tmp/temp-install

--disable-static
相关问题