;ELC ;;; Compiled ;;; in Emacs version 28.0.50 ;;; with all optimizations. (byte-code "\300\301!\210\300\302!G\210\303\304!\210\303\305!\210\303\306!\207" [ess-get-words-from-vector "c('aaa','bbb\"ccc', 'dddd')\n" "as.character(1:10000)\n" ess-command "tf<-function(N){\nN}\n" "\nlm_test <- function (formula, data, subset, weights, na.action, method = 'qr',\n model = TRUE, x = FALSE, y = FALSE, qr = TRUE, singular.ok = TRUE,\n contrasts = NULL, offset, ...)\n{\n cl <- match.call()\n mf <- match.call(expand.dots = FALSE)\n m <- match(c('formula', 'data', 'subset', 'weights', 'na.action',\n 'offset'), names(mf), 0L)\n mf <- mf[c(1L, m)]\n mf$drop.unused.levels <- TRUE\n mf[[1L]] <- as.name('model.frame')\n mf <- eval(mf, parent.frame())\n if (method == 'model.frame')\n return(mf)\n else if (method != 'qr')\n warning(gettextf('method is not supported. Using',\n method), domain = NA)\n mt <- attr(mf, 'terms')\n y <- model.response(mf, 'numeric')\n w <- as.vector(model.weights(mf))\n if (!is.null(w) && !is.numeric(w))\n stop('weights must be a numeric vector')\n offset <- as.vector(model.offset(mf))\n if (!is.null(offset)) {\n if (length(offset) != NROW(y))\n stop(gettextf('number of offsets is %d, should equal %d (number of observations)',\n length(offset), NROW(y)), domain = NA)\n }\n if (is.empty.model(mt)) {\n x <- NULL\n z <- list(coefficients = if (is.matrix(y)) matrix(, 0,\n 3) else numeric(0L), residuals = y, fitted.values = 0 *\n y, weights = w, rank = 0L, df.residual = if (!is.null(w)) sum(w !=\n 0) else if (is.matrix(y)) nrow(y) else length(y))\n if (!is.null(offset)) {\n z$fitted.values <- offset\n z$residuals <- y - offset\n }\n }\n else {\n x <- model.matrix(mt, mf, contrasts)\n z <- if (is.null(w))\n lm.fit(x, y, offset = offset, singular.ok = singular.ok,\n ...)\n else lm.wfit(x, y, w, offset = offset, singular.ok = singular.ok,\n ...)\n }\n class(z) <- c(if (is.matrix(y)) 'mlm', 'lm')\n z$na.action <- attr(mf, 'na.action')\n z$offset <- offset\n z$contrasts <- attr(x, 'contrasts')\n z$xlevels <- .getXlevels(mt, mf)\n z$call <- cl\n z$terms <- mt\n if (model)\n z$model <- mf\n if (ret.x)\n z$x <- x\n if (ret.y)\n z$y <- y\n if (!qr)\n z$qr <- NULL\n z\n}\nstr(iris)\n" "\n\n\n"] 2)