Skip to content

Commit

Permalink
continue to satisfy the CRAN gods
Browse files Browse the repository at this point in the history
  • Loading branch information
philchalmers committed Nov 29, 2017
1 parent 1cb5389 commit 3147e6e
Show file tree
Hide file tree
Showing 28 changed files with 44 additions and 45 deletions.
7 changes: 4 additions & 3 deletions DESCRIPTION
Original file line number Diff line number Diff line change
@@ -1,5 +1,5 @@
Package: mirt
Version: 1.26.2
Version: 1.26.3
Type: Package
Title: Multidimensional Item Response Theory
Authors@R: c( person("Phil", family="Chalmers", email =
Expand All @@ -14,8 +14,9 @@ Authors@R: c( person("Phil", family="Chalmers", email =
person("David", family="King", role=c('ctb')))
Description: Analysis of dichotomous and polytomous response data using
unidimensional and multidimensional latent trait models under the Item
Response Theory paradigm. Exploratory and confirmatory models can be
estimated with quadrature (EM) or stochastic (MHRM) methods. Confirmatory
Response Theory paradigm (Chalmers (2012) <doi:10.18637/jss.v048.i06>).
Exploratory and confirmatory models can be estimated with quadrature (EM)
or stochastic (MHRM) methods. Confirmatory
bi-factor and two-tier analyses are available for modeling item testlets.
Multiple group analysis and mixed effects designs also are available for
detecting differential item and test functioning as well as modelling
Expand Down
5 changes: 3 additions & 2 deletions NEWS.md
Original file line number Diff line number Diff line change
@@ -1,4 +1,4 @@
# Changes in mirt 1.26.2
# Changes in mirt 1.26.3

- `mod2values()` and passing `pars = 'values'` now return `data.frame` objects without any
factor variables (previously the defaults to `data.frame()` were used, which created factors
Expand Down Expand Up @@ -36,7 +36,8 @@
- Fix initialization of `fscores()` when using 'MH' plausible value imputations (reported by
Charlie Iaconangelo)

- Various other small bug fixes and performance improvements
- Various other small bug fixes and performance improvements, fixes for Solaris compatibility,
and run a small number of examples during R CMD check

# Changes in mirt 1.25

Expand Down
1 change: 1 addition & 0 deletions R/SIBTEST.R
Original file line number Diff line number Diff line change
Expand Up @@ -61,6 +61,7 @@
#' \emph{Psychometrika, 58}, 159-194.
#'
#' @examples
#'
#' \dontrun{
#'
#' set.seed(1234)
Expand Down
2 changes: 1 addition & 1 deletion R/areainfo.R
Original file line number Diff line number Diff line change
Expand Up @@ -22,11 +22,11 @@
#' @export areainfo
#' @examples
#'
#' \dontrun{
#' dat <- expand.table(LSAT7)
#' mod <- mirt(dat, 1)
#'
#' areainfo(mod, c(-2,0), which.items = 1) #item 1
#' \dontrun{
#' areainfo(mod, c(-2,0), which.items = 1:3) #items 1 to 3
#' areainfo(mod, c(-2,0)) # all items (total test information)
#'
Expand Down
3 changes: 0 additions & 3 deletions R/createGroup.R
Original file line number Diff line number Diff line change
Expand Up @@ -40,8 +40,6 @@
#' @export createGroup
#' @examples
#'
#' \dontrun{
#'
#' # normal density example, N(mu, sigma^2)
#' den <- function(obj, Theta) dnorm(Theta, obj@par[1], sqrt(obj@par[2]))
#' par <- c(mu = 0, sigma2 = .5)
Expand All @@ -56,7 +54,6 @@
#' coef(mod)
#' coef(modcustom)
#'
#' }
createGroup <- function(par, est, den, nfact, gr = NULL, hss = NULL, gen = NULL,
lbound = NULL, ubound = NULL, derivType = 'Richardson'){
if(missing(par)) missingMsg('par')
Expand Down
3 changes: 0 additions & 3 deletions R/expand.table.R
Original file line number Diff line number Diff line change
Expand Up @@ -20,7 +20,6 @@
#' @export expand.table
#' @examples
#'
#' \dontrun{
#' data(LSAT7)
#' head(LSAT7)
#' LSAT7full <- expand.table(LSAT7)
Expand All @@ -29,8 +28,6 @@
#' LSAT7full <- expand.table(LSAT7, sample = TRUE)
#' head(LSAT7full)
#'
#' }
#'
expand.table <- function(tabdata, sample = FALSE) {
if(missing(tabdata)) missingMsg('tabdata')
if (sum(tabdata[,ncol(tabdata)]) <= nrow(tabdata))
Expand Down
2 changes: 0 additions & 2 deletions R/expected.item.R
Original file line number Diff line number Diff line change
Expand Up @@ -19,14 +19,12 @@
#' @seealso \code{\link{extract.item}}, \code{\link{expected.test}}
#' @examples
#'
#' \dontrun{
#' mod <- mirt(Science, 1)
#' extr.2 <- extract.item(mod, 2)
#' Theta <- matrix(seq(-6,6, length.out=200))
#' expected <- expected.item(extr.2, Theta, min(Science[,1])) #min() of first item
#' head(data.frame(expected, Theta=Theta))
#'
#' }
expected.item <- function(x, Theta, min = 0){
if(missing(x)) missingMsg('x')
if(missing(Theta)) missingMsg('Theta')
Expand Down
4 changes: 2 additions & 2 deletions R/fscores.R
Original file line number Diff line number Diff line change
Expand Up @@ -126,11 +126,11 @@
#'
#' @examples
#'
#' \dontrun{
#'
#' mod <- mirt(Science, 1)
#' tabscores <- fscores(mod, full.scores = FALSE)
#' head(tabscores)
#'
#' \dontrun{
#' fullscores <- fscores(mod)
#' fullscores_with_SE <- fscores(mod, full.scores.SE=TRUE)
#' head(fullscores)
Expand Down
3 changes: 2 additions & 1 deletion R/iteminfo.R
Original file line number Diff line number Diff line change
Expand Up @@ -25,7 +25,6 @@
#' @export iteminfo
#' @examples
#'
#' \dontrun{
#' mod <- mirt(Science, 1)
#' extr.2 <- extract.item(mod, 2)
#' Theta <- matrix(seq(-4,4, by = .1))
Expand All @@ -34,6 +33,8 @@
#' #do something with the info?
#' plot(Theta, info.2, type = 'l', main = 'Item information')
#'
#' \dontrun{
#'
#' #category information curves
#' cat.info <- iteminfo(extr.2, Theta, total.info = FALSE)
#' plot(Theta, cat.info[,1], type = 'l', ylim = c(0, max(cat.info)),
Expand Down
3 changes: 2 additions & 1 deletion R/marginal_rxx.R
Original file line number Diff line number Diff line change
Expand Up @@ -19,14 +19,15 @@
#' @seealso \code{\link{empirical_rxx}}, \code{\link{extract.group}}, \code{\link{testinfo}}
#' @examples
#'
#' \dontrun{
#'
#' dat <- expand.table(deAyala)
#' mod <- mirt(dat, 1)
#'
#' # marginal estimate
#' marginal_rxx(mod)
#'
#' \dontrun{
#'
#' # empirical estimate (assuming the same prior)
#' fscores(mod, returnER = TRUE)
#'
Expand Down
3 changes: 2 additions & 1 deletion R/mdirt.R
Original file line number Diff line number Diff line change
Expand Up @@ -73,12 +73,13 @@
#' @export mdirt
#' @examples
#'
#' \dontrun{

#' #LSAT6 dataset
#' dat <- expand.table(LSAT6)
#'
#' # fit with 2-3 latent classes
#' (mod2 <- mdirt(dat, 2))
#' \dontrun{
#' (mod3 <- mdirt(dat, 3))
#' summary(mod2)
#' residuals(mod2)
Expand Down
6 changes: 5 additions & 1 deletion R/mirt.R
Original file line number Diff line number Diff line change
Expand Up @@ -700,12 +700,16 @@
#' @export mirt
#' @examples
#'
#' \dontrun{
#' #load LSAT section 7 data and compute 1 and 2 factor models
#' data <- expand.table(LSAT7)
#'
#' (mod1 <- mirt(data, 1))
#' coef(mod1)
#' summary(mod1)
#' plot(mod1)
#' plot(mod1, type = 'trace')
#'
#' \dontrun{
#' (mod2 <- mirt(data, 1, SE = TRUE)) #standard errors via the Oakes method
#' (mod2 <- mirt(data, 1, SE = TRUE, SE.type = 'SEM')) #standard errors with SEM method
#' coef(mod2)
Expand Down
3 changes: 0 additions & 3 deletions R/probtrace.R
Original file line number Diff line number Diff line change
Expand Up @@ -19,15 +19,12 @@
#' \code{\link{extract.item}}
#' @examples
#'
#' \dontrun{
#' mod <- mirt(Science, 1)
#' extr.2 <- extract.item(mod, 2)
#' Theta <- matrix(seq(-4,4, by = .1))
#' traceline <- probtrace(extr.2, Theta)
#'
#' head(data.frame(traceline, Theta=Theta))
#'
#' }
probtrace <- function(x, Theta){
if(missing(x)) missingMsg('x')
if(missing(Theta)) missingMsg('Theta')
Expand Down
3 changes: 2 additions & 1 deletion R/simdata.R
Original file line number Diff line number Diff line change
Expand Up @@ -84,7 +84,6 @@
#' @export simdata
#' @examples
#'
#' \dontrun{
#' ### Parameters from Reckase (2009), p. 153
#'
#' set.seed(1234)
Expand Down Expand Up @@ -135,6 +134,8 @@
#' #mod <- mirt(dataset1, 3, method = 'MHRM')
#' #coef(mod)
#'
#' \dontrun{
#'
#' ### Unidimensional graded response model with 5 categories each
#'
#' a <- matrix(rlnorm(20,.2,.3))
Expand Down
3 changes: 2 additions & 1 deletion R/testinfo.R
Original file line number Diff line number Diff line change
Expand Up @@ -22,7 +22,6 @@
#' @export testinfo
#' @examples
#'
#' \dontrun{
#' dat <- expand.table(deAyala)
#' (mirt(dat, 1, '2PL', pars = 'values'))
#' mod <- mirt(dat, 1, '2PL', constrain = list(c(1,5,9,13,17)))
Expand All @@ -31,6 +30,8 @@
#' tinfo <- testinfo(mod, Theta)
#' plot(Theta, tinfo, type = 'l')
#'
#' \dontrun{
#'
#' #compare information loss between two tests
#' tinfo_smaller <- testinfo(mod, Theta, which.items = 3:5)
#'
Expand Down
1 change: 1 addition & 0 deletions man/SIBTEST.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/areainfo.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

3 changes: 0 additions & 3 deletions man/createGroup.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

3 changes: 0 additions & 3 deletions man/expand.table.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 0 additions & 2 deletions man/expected.item.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

4 changes: 2 additions & 2 deletions man/fscores.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

3 changes: 2 additions & 1 deletion man/iteminfo.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

3 changes: 2 additions & 1 deletion man/marginal_rxx.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/mdirt.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

6 changes: 5 additions & 1 deletion man/mirt.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

Loading

0 comments on commit 3147e6e

Please sign in to comment.