... | ... |
@@ -258,7 +258,7 @@ calcStandardError<-function(mod,fitln,fitzero,coef=2,exclude=NULL){ |
258 | 258 |
p0 <- t(exp(theta0) / (1+exp(theta0))) |
259 | 259 |
|
260 | 260 |
checkInverse <- function(m){ |
261 |
- class(try(qr.solve(m),silent=T))=="matrix" |
|
261 |
+ inherits(try(qr.solve(m),silent=T), "matrix") |
|
262 | 262 |
} |
263 | 263 |
|
264 | 264 |
Dp2 <- diag(length(p))*as.vector(p*(1-p)) |