最新消息:雨落星辰是一个专注网站SEO优化、网站SEO诊断、搜索引擎研究、网络营销推广、网站策划运营及站长类的自媒体原创博客

glm - Error in Y %*% Q01 : non-conformable arguments using Zicoseq in GUnifrac? - Stack Overflow

programmeradmin1浏览0评论

I'm trying to use Zicoseq on my data set and run into these non-conformable arguments. I've made sure that my originating matrices have the equal amount of rows (16), and that the columns look the same, but I continue to get the error.

Below is my code:

I'll get the following error:

input_taxonomy <- input_taxonomy2 %>% remove_rownames %>% column_to_rownames(var = "bins")

data <- t(input_taxonomy)

input_metadata <- metadata2 %>% remove_rownames %>% column_to_rownames(var="SampleID")

input_metadata <- as.data.frame(input_metadata)
input_metadata$Treatment <- as.factor(input_metadata$Treatment)
data <- as.matrix(data)

###run ZicoSeq

ZicoSeq.obj <- ZicoSeq(meta.dat = input_metadata, feature.dat = data,                        
                       grp.name = 'Treatment', feature.dat.type = "other", prev.filter = 0.1, mean.abund.filter = 0,
                       max.abund.filter = 0, min.prop = 0,  is.winsor = TRUE, outlier.pct = 0.03, winsor.end = 'top', is.post.sample = TRUE, 
                       post.sample.no = 16, link.func = list(function (x) x), statsbine.func = max, perm.no = 999,  strata = NULL, 
                       ref.pct = 0.5, stage.no = 6, excl.pct = 0.2, is.fwer = TRUE, verbose = TRUE, return.feature.dat = TRUE)

Error in Y %*% Q01 : non-conformable arguments

I've also tried to run it with randomly generated data, but I still get a different albeit slightly similar error. I try to check what the error is in Y, but it doesn't exist.

# example data
set.seed(123)
example_metadata <- data.frame(Treatment = factor(rep(c("A", "B"), each = 8)))
example_data <- matrix(runif(16 * 10, 0, 1), ncol = 10)
rownames(example_metadata) <- paste("Sample", 1:16, sep = "_")
colnames(example_data) <- paste("Feature", 1:10, sep = "_")

# test 
ZicoSeq.obj <- ZicoSeq(meta.dat = example_metadata, feature.dat = example_data,                        
                       grp.name = 'Treatment', feature.dat.type = "proportion", prev.filter = 0.1, 
                       mean.abund.filter = 0, max.abund.filter = 0, min.prop = 0, is.winsor = TRUE, 
                       outlier.pct = 0.03, winsor.end = 'top', is.post.sample = TRUE, 
                       post.sample.no = 16, link.func = list(function(x) x), statsbine.func = max, 
                       perm.no = 999, strata = NULL, ref.pct = 0.5, stage.no = 6, excl.pct = 0.2, 
                       is.fwer = TRUE, verbose = TRUE, return.feature.dat = TRUE)

Error in XXIM %*% Y : non-conformable arguments

Any help? Thank you!

发布评论

评论列表(0)

  1. 暂无评论