Displaying 2 results from an estimated 2 matches for "df_gmh".
Did you mean:
  df_csmh
  
2005 Apr 07
2
about mantelhaen.test (PR#7779)
...herefore, I modify part of the function such that output looks as the same as
SASs.
mh.test <- function(x) {         
    if (any(apply(x, 3, sum) < 2)) 
        stop("sample size in each stratum must be > 1")
    I <- dim(x)[1];    J <- dim(x)[2];    K <- dim(x)[3]
    df_GMH <- (I - 1) * (J - 1);    df_SMH <- I - 1;    df_CSMH <- 1
    A_GMH <- cbind(diag(I-1), 0) %x% cbind(diag(J-1), 0)
    A_SMH <- cbind(diag(I-1), 0) %x% t(1:J)
    A_CSMH <- t(1:I) %x% t(1:J)
    Y_GMH <- matrix(0, nc = 1, nr = df_GMH)
    Y_SMH <- matrix(0, nc = 1, nr = df_S...
2006 Oct 31
0
about mantelhaen.test (PR#7779)
...amp; !is.null(row_scores) ) |
(length(col_scores) !=3D J & !is.null(col_scores)) ){
        stop("scores dimensions must equal to data dimensions")
    }
    if (is.null(row_scores)){
        row_scores =3D 1:I
    }
    if (is.null(col_scores)) {
        col_scores =3D 1:J
    }
    df_GMH <- (I - 1) * (J - 1);    df_SMH <- I - 1;    df_CSMH <- 1
    A_GMH <- cbind(diag(I-1), 0) %x% cbind(diag(J-1), 0)
    #A_SMH <- cbind(diag(I-1), 0) %x% t(1:J)
    A_SMH <- cbind(diag(I-1), 0) %x% t(col_scores)
    #A_CSMH <- t(1:I) %x% t(1:J)
    A_CSMH <- t(row_scores) %x%...