[Splm-commits] r39 - pkg

noreply at r-forge.r-project.org noreply at r-forge.r-project.org
Tue Oct 13 16:08:27 CEST 2009


Author: gpiras
Date: 2009-10-13 16:08:26 +0200 (Tue, 13 Oct 2009)
New Revision: 39

Removed:
   pkg/effects.splm.R
Log:
eliminate all functions erroneously  uploaded

Deleted: pkg/effects.splm.R
===================================================================
--- pkg/effects.splm.R	2009-10-13 14:08:12 UTC (rev 38)
+++ pkg/effects.splm.R	2009-10-13 14:08:26 UTC (rev 39)
@@ -1,66 +0,0 @@
-`effects.splm`<- function(object,...){
-	x<-object
-	if (class(x) != "splm") stop(paste("methos not implemented for objects of class", class(x)))
-	if (class(x) != "splm" && (x$type != "fixed effects lag" || x$type != "fixed effects error")) stop(paste("methos not implemented for objects of type", x$type))
-	all.FE<-x$res.eff[[1]]
-	effects <- x$effects
-if (effects=="pooled") stop("No fixed effects available if effects == pooled")
-if(effects=="spfe"){
-	INT <- all.FE$intercept
-	se.INT<- all.FE$res.t.con
-	z <- INT/se.INT
-   p <- 2*pnorm(abs(z),lower.tail=FALSE)
-   INTTable <- cbind(INT,se.INT,z,p)
-	colnames(INTTable) <- c("Estimate","Std. Error","t-value","Pr(>|t|)")
-	rownames(INTTable) <- "(Intercept)"
-	SP.EFF <- all.FE$res.sfe
-	se.SP.EFF <- all.FE$res.t.sfe 
-	z <- SP.EFF/se.SP.EFF
-   p <- 2*pnorm(abs(z),lower.tail=FALSE)
-   SETable <- cbind(SP.EFF,se.SP.EFF,z,p)
-	colnames(SETable) <- c("Estimate","Std. Error","t-value","Pr(>|t|)")
-res<-list(INTTable=INTTable,SETable=SETable, effects=effects)
-	}
-if(effects=="tpfe"){
-	INT <- all.FE$intercept
-	se.INT<- all.FE$res.t.con
-	z <- INT/se.INT
-   p <- 2*pnorm(abs(z),lower.tail=FALSE)
-   INTTable <- cbind(INT,se.INT,z,p)
-	colnames(INTTable) <- c("Estimate","Std. Error","t-value","Pr(>|t|)")
-	rownames(INTTable) <- "(Intercept)"
-	TP.EFF <- all.FE$res.tfe
-	se.TP.EFF <- all.FE$res.t.tfe 
-	z <- TP.EFF/se.TP.EFF
-   p <- 2*pnorm(abs(z),lower.tail=FALSE)
-   TETable <- cbind(TP.EFF,se.TP.EFF,z,p)
-	colnames(TETable) <- c("Estimate","Std. Error","t-value","Pr(>|t|)")
-res<-list(INTTable=INTTable,TETable=TETable,effects=effects)
-	}
-if(effects=="sptpfe"){
-	INT <- all.FE$intercept
-	se.INT<- all.FE$res.t.con
-	z <- INT/se.INT
-   p <- 2*pnorm(abs(z),lower.tail=FALSE)
-   INTTable <- cbind(INT,se.INT,z,p)
-	colnames(INTTable) <- c("Estimate","Std. Error","t-value","Pr(>|t|)")
-	rownames(INTTable) <- "(Intercept)"
-	SP.EFF <- all.FE$res.sfe
-	se.SP.EFF <- all.FE$res.t.sfe 
-	z <- SP.EFF/se.SP.EFF
-   p <- 2*pnorm(abs(z),lower.tail=FALSE)
-   SETable <- cbind(SP.EFF,se.SP.EFF,z,p)
-	colnames(SETable) <- c("Estimate","Std. Error","t-value","Pr(>|t|)")
-		TP.EFF <- all.FE$res.tfe
-	se.TP.EFF <- all.FE$res.t.tfe 
-	z <- TP.EFF/se.TP.EFF
-   p <- 2*pnorm(abs(z),lower.tail=FALSE)
-   TETable <- cbind(TP.EFF,se.TP.EFF,z,p)
-	colnames(TETable) <- c("Estimate","Std. Error","t-value","Pr(>|t|)")
-res<-list(INTTable=INTTable,SETable=SETable,TETable=TETable,effects=effects)
-	}
-res
-class(res) <- "effects.splm"
-return(res)
-	}
-



More information about the Splm-commits mailing list