在R和RStudio的控制台中显示不同

时间:2014-08-07 21:52:02

标签: r rstudio

按照教程的代码,我为线性回归函数定义了类和方法。

data(cats, package="MASS")
linmodeEst <- function(x,y){

  qx   <- qr(x) # QR-decomposition
  coef <- solve.qr(qx,y) # solve(t(x)%*%x)%*%t(x)%*%y

  df     <- nrow(x)-ncol(x)
  sigma2 <- sum((y-x%*%coef)^2)/df
  vcov   <- sigma2 * chol2inv(qx$qr)

  colnames(vcov) <- rownames(vcov) <- colnames(x)

  list(coefficients = coef, vcov=vcov, sigma = sqrt(sigma2), df=df)
}

linmod <- function(x,...) UseMethod("linmod")

linmod.default <- function(x,y,...){
  x <- as.matrix(x)
  y <- as.matrix(y)

  est <- linmodeEst(x,y)

  est$fitted.values <- as.vector(x%*%est$coefficients)
  est$residuals     <- y - est$fitted.values
  est$call          <- match.call()
  class(est) <- "linmod"
  est
}

print.linmod <- function(x,...){
  cat("Call:\n")
  print(x$call)
  cat("\nCoefficients:\n")
  print(x$coefficients)
}

summary.linmod <- function(object,...){
  se <- sqrt(diag(object$vcov))
  tval <- coef(object)/se
  TAB <- cbind(Estimate = coef(object),
               StdErr = se,
               t.value = tval,
               p.value = 2*pt(-abs(tval), df=object$df))
  res <- list(call=object$call, coefficients=TAB)
  class(res) <- "summary.linmod"
  res
}

print.summary.linmod <- function(x,...){
  cat("Call:\n")
  print(x$call)
  cat("\n")

  printCoefmat(x$coefficients, P.value=TRUE, has.Pvalue=TRUE)
}
x = cbind(Const=1, Bwt=cats$Bwt)
y = cats$Hw
mod1 <- linmod(x,y)
summary(mod1)

所以,在summary.linmod <- function(object,...)我定义了表名:Estimate, StdErr, t.value, p.value。在R中我得到标题中的所有名称,在RStudio中只是StdErr。为什么会这样?

我的系统:Linux 64bit,R 3.1.1

enter image description here

1 个答案:

答案 0 :(得分:0)

?cbind处的文档指出:&#34;对于cbind(rbind),列(行)名称取自参数的colnames(rownames),如果这些是类似矩阵的话。&#34 ;

在构建TAB时,您将3个单列矩阵(即coef(object)tval2*pt(-abs(tval), df=object$df)绑定到se(非{由于上面引用的行为,cbind使用矩阵&#39;名称(空)来命名TAB的矩阵列。

使用cbind.data.frame或简单地data.frame构建TAB,您的摘要输出将具有预期的名称:

summary.linmod <- function(object,...){
  se <- sqrt(diag(object$vcov))
  tval <- coef(object)/se
  TAB <- data.frame(Estimate = coef(object),
                    StdErr = se,
                    t.value = tval,
                    p.value = 2*pt(-abs(tval), df=object$df))
  res <- list(call=object$call, coefficients=TAB)
  class(res) <- "summary.linmod"
  res
}


> summary(mod1)
# Call:
# linmod.default(x = x, y = y)
# 
#       Estimate   StdErr t.value p.value    
# Const -0.35666  0.69228 -0.5152  0.6072    
# Bwt    4.03406  0.25026 16.1194  <2e-16 ***
# ---
# Signif. codes:  0 ‘***’ 0.001 ‘**’ 0.01 ‘*’ 0.05 ‘.’ 0.1 ‘ ’ 1