常见问题 第2页
这里汇总了用户在使用统计猿网页版和桌面版软件时遇到的常见问题与处理方法。
批量去除连锁不平衡:Error in file(file,

批量去除连锁不平衡:Error in file(file, “rt”): cannot open the connection

报错原因:plink分析SNP关联的结果无法写出到计算机,可能的原因有很多,以下为常见原因(1)plink的版本与计算机不兼容,在windows系统中分为32位和64位(2)plink的写出权限不足(与计算机有...
空鱼O的头像-决策链社区论坛空鱼O3个月前
08914
Dependent Variable should be in Two Categories-决策链社区论坛

Dependent Variable should be in Two Categories

【报错原因】 变量选择有问题,必须是0和1的二分类变量 【解决方法】 更换因变量
里里里里卡42的头像-决策链社区论坛里里里里卡424个月前
05514
一般线性相关分析:Error in cor(WD[, final varl, method =

一般线性相关分析:Error in cor(WD[, final varl, method =”pearson”):’x’◆◆◆◆|◆◆

报错原因:Pearson算法只能输入连续性数据进行计算解决方法:(1)检查所有变量的类型,保证所有变量类型为连续型
空鱼O的头像-决策链社区论坛空鱼O10天前
05514
生存分析多模型ROC图:Error in data.frame(x=pre_score,y=status values$qx_status, time = status_values$qx time): �����������: 2266,2265-决策链社区论坛

生存分析多模型ROC图:Error in data.frame(x=pre_score,y=status values$qx_status, time = status_values$qx time): �����������: 2266,2265

报错原因:通常为数据端口(蓝色)的连线和模型端口(灰色)的链线顺序不一致解决方法:检查两种端口的连线顺序是否一致
空鱼O的头像-决策链社区论坛空鱼O2个月前
07414
Mimic:
异常类型:PostgresExceptidm
异常消息:42712: WITH 查询名

Mimic: 异常类型:PostgresExceptidm 异常消息:42712: WITH 查询名”carvedilol phosphate”被指定多次

报错原因:提取的药物信息中存在相同的英文名解决方法:对于相同的药物英文名,应该修改英文简称,注意前后缀不要出现空格等非法符号 
空鱼O的头像-决策链社区论坛空鱼O3个月前
09514
Error in glmnet(x, y, family =

Error in glmnet(x, y, family = “binomial”, alpha = 1, nlambda = lambda_values) :x has missing values; consider using makeX() to impute them

【报错原因】 选择变量里含有空缺值 【解决方法】 建议将变量的空缺值进行插补
里里里里卡42的头像-决策链社区论坛里里里里卡424个月前
07214
Error in jags.model(model.file, data = data, inits = init.values, n.chains = n.chains, :Error in node rt[2]Node inconsistent with parents-决策链社区论坛
3 nodes produced errors;, first error: matrix multiplication: incompatible matrix dimensions:5595x2 and 4x1-决策链社区论坛

3 nodes produced errors;, first error: matrix multiplication: incompatible matrix dimensions:5595×2 and 4×1

【报错原因】 模型不拟合 【解决方法】 换变量,数据,模型数量
里里里里卡42的头像-决策链社区论坛里里里里卡424个月前
09914
孟德尔随机化本地数据:Error in h(simpleError(msg, call)):◆◆'seqinfo

孟德尔随机化本地数据:Error in h(simpleError(msg, call)):◆◆’seqinfo”◆◆◆◆◆◆h◆◆◆◆’x”◆◆◆◆@◆◆.:no ‘header’ line “#CHROM POS ID..”?

报错原因:输入的GWAS遗传变异位点数据表格式非法,ieu数据库中收录的GWAS数据集很多存在这个问题,而且经常更新解决方案:(1)ieu官网重新下载目标编号的GWAS数据集(2)更换别的GWAS数据集
空鱼O的头像-决策链社区论坛空鱼O4个月前
012614
多因素限制立方样条曲线:Error in `[.data.frame`(unique_cbind_dataframe, , xvar_data[i]) : 选择了未定义的列-决策链社区论坛

多因素限制立方样条曲线:Error in `[.data.frame`(unique_cbind_dataframe, , xvar_data[i]) : 选择了未定义的列

错误原因:数据端口输入顺序与自变量选择顺序不一致解决方法:(1)重新连接数据端口,保持连接顺序与自变量选择选择顺序一致,如下图,如果多因素限制立方样条曲线节点选择的自变量顺序为Var2...
机器学习SE的ROC曲线反向,如何修正?-决策链社区论坛

机器学习SE的ROC曲线反向,如何修正?

问题说明:这并非运行错误,而是ROC曲线反向,在二分类问题中通常正类为基准类,此图的情况则是将负类作为了基准类。解决方法:在训练任务创建前,定义好正类的标签 
空鱼O的头像-决策链社区论坛空鱼O3个月前
012314
Error in dosresmeta.fit(X[v != 0, , drop = FALSE], Z[v != 0, , drop = FALSE], :A two-stage approach requires that each study provides at least p non-referent obs (p is the number of columns of the design matrix X)-决策链社区论坛
调查设计秩和检验:Error in if (length(unique ind) == 2 || !is.na(model[

调查设计秩和检验:Error in if (length(unique ind) == 2 || !is.na(model[“estimate”]][[“difference in mean rank score”])) {:missing value where TRUE/FALSE needed

错误原因:(1)分组变量异常,可能不存在这个变量(2)统计模型拟合失败,无法得到统计值解决方法:(1)重新拖一个节点后把参数重新设置一遍(2)选择方法参数,切换其他统计模型方法(3)修...
空鱼O的头像-决策链社区论坛空鱼O4个月前
05414
Error in scale.default(X, X[v == 0, ], scale = FALSE) :'center'的长度必需和'x'列的数目相同-决策链社区论坛

Error in scale.default(X, X[v == 0, ], scale = FALSE) :’center’的长度必需和’x’列的数目相同

【报错原因】 数据不符合要求 【解决方法】 更换数据
里里里里卡42的头像-决策链社区论坛里里里里卡424个月前
09314
生存分析截断值搜索:Error in Summary.factor(c(2L,1L,1L,2L,1L,2L,2L,2L,1L,1L,1L,:

生存分析截断值搜索:Error in Summary.factor(c(2L,1L,1L,2L,1L,2L,2L,2L,1L,1L,1L,:”range’not meaningful for factors

报错原因:自变量用与分段搜素,不能输入分类型变量解决方法:检查自变量类型,确保输入的自变量为连续型 
空鱼O的头像-决策链社区论坛空鱼O1个月前
06714
Error in cut.default(x, c(bins[1] - delta, bins)) : 'breaks' 的值有重复-决策链社区论坛

Error in cut.default(x, c(bins[1] – delta, bins)) : ‘breaks’ 的值有重复

【报错原因】 “预测时间点”、“区间样本数”数值不合适 【解决方法】 调整“预测时间点”、“区间样本数”
This happened PipeOp colapply's $train()-决策链社区论坛

This happened PipeOp colapply’s $train()

Error in .__Task__col_roles(self = self, private = private, super = super, : Assertion on 'names of col_roles' failed: Names must be a permutation of set {'feature','target','name'...
Divine的头像-决策链社区论坛Divine3个月前
07214
Error in confusionMatrix,default(as.factor(y pred label)reference = as.factorly label): The data must contain some levels that overlap the reference…-决策链社区论坛

Error in confusionMatrix,default(as.factor(y pred label)reference = as.factorly label): The data must contain some levels that overlap the reference…

【报错原因】 DCA绘图里:y_pred_label <- as.numeric(y_pred_score > thresh)cm <- confusionMatrix(as.factor(y_pred_label), reference = as.factor(y_label))$table 【解决方法】 ...
Error in ranger::ranger(dependent.variable.name = task$target_names, data = task$data(),  :   User interrupt or internal error.-决策链社区论坛

Error in ranger::ranger(dependent.variable.name = task$target_names, data = task$data(), : User interrupt or internal error.

【报错原因】对于随机森林模型(无论是回归、分类还是生存分析),需要特别注意 mtry 参数的设置。mtry 参数表示每次分裂时,模型随机选择的特征变量的数量。在设置 mtry 值时,必须确保其不超...
Divine的头像-决策链社区论坛Divine4个月前
07214
Meta偏差分析生成结果表但表中结果为空-决策链社区论坛

Meta偏差分析生成结果表但表中结果为空

【报错原因】 Meta二分类结局分析选择了分组变量或Meta连续型结局分析选择了分层变量
里里里里卡42的头像-决策链社区论坛里里里里卡424个月前
08714
生存分析ROC图:Error in roc.default(response, predictors[, 1], ...) : 'response' must have two levels-决策链社区论坛

生存分析ROC图:Error in roc.default(response, predictors[, 1], …) : ‘response’ must have two levels

报错原因: (1)输入的因变量不是0,1二分类的值 (2)在多因素生存分析中,如果以上的情况不存在,则可能是生存时间中位数以下的样本的生存状态不是0,1二分类变量 解决方法: 检查因变量是否...
空鱼O的头像-决策链社区论坛空鱼O3个月前
07814
IDI和NRI:Error in if (pest$lDI > 0) {: missing value where TRUE/FALSE needed-决策链社区论坛

IDI和NRI:Error in if (pest$lDI > 0) {: missing value where TRUE/FALSE needed

报错原因:模型变量组合导致IDI无法计算解决方法:建议检查变量类型,或者替换模型变量组合
空鱼O的头像-决策链社区论坛空鱼O17天前
05114
Error in compute.aggte(MP = MP, type = type, balance_e = balance_e, min_e = min_e, :Missing values at att_gt found. If you want to remove these, set `na.rm = TRUE'.-决策链社区论坛

Error in compute.aggte(MP = MP, type = type, balance_e = balance_e, min_e = min_e, :Missing values at att_gt found. If you want to remove these, set `na.rm = TRUE’.

【报错原因】 分析模型没有结果或结果存在NA 【解决方法】 建议更换模型
里里里里卡42的头像-决策链社区论坛里里里里卡424个月前
06314
Error: You should have at least two distinct break values.        Value cannot be null. (Parameter 's')-决策链社区论坛

Error: You should have at least two distinct break values. Value cannot be null. (Parameter ‘s’)

【报错原因】模型拟合问题【解决方法】更换模型或变量
里里里里卡42的头像-决策链社区论坛里里里里卡424个月前
08314
Error in tempfile() : cannot find unused tempfile name-决策链社区论坛

Error in tempfile() : cannot find unused tempfile name

【解决方法】 关闭软件,重新开启。
里里里里卡42的头像-决策链社区论坛里里里里卡424个月前
07614
递归消除法:worker initialization failed: package or namespace load failed for 'caret'.object 'recvData' is not exported by'namespace:parallel'-决策链社区论坛

递归消除法:worker initialization failed: package or namespace load failed for ‘caret’.object ‘recvData’ is not exported by’namespace:parallel’

报错原因:R环境缺失一个包caret解决方法:参考这篇文章安装caret,https://bbs.statsape.com/q-and-a/578.html
空鱼O的头像-决策链社区论坛空鱼O3个月前
09514
IDI和NRI:Error in coxph(Surv(xi, di) ~ zi) : No (non-missing) observations-决策链社区论坛

IDI和NRI:Error in coxph(Surv(xi, di) ~ zi) : No (non-missing) observations

报错原因:自变量不支持字符串输入解决方法:把字符串变量转为数值编码再输入
空鱼O的头像-决策链社区论坛空鱼O17天前
03414
Error in names(.cols) <- grp.levels :'names' attribute [33] must be the same length as the vector [31]-决策链社区论坛

Error in names(.cols) <- grp.levels :'names' attribute [33] must be the same length as the vector [31]

【报错原因】 Total KM 曲线绘图颜色出现问题 【解决方法】 如果想要total的KM曲线,建议减少变量
里里里里卡42的头像-决策链社区论坛里里里里卡424个月前
09814
Error in nls(y ~ 1/(1 + exp((xmid - x)/scal)), data = xy, start = list(xmid = aux[[1L]], :算法的步因素0.000488281的大小被减少到小于0.000976562的'minFactor'值。          Error in nls(y ~ 1/(1 + exp((xmid - x)/scal)), data = xy, start = list(xmid = aux[[1L]], :奇异梯度。                                                                                                                         Error in numericDeriv(form[[3L]], names(ind), env, central = nDcentral) :在计算模型的时候产生了缺省值或无限值。                                                                                            Error in qr.solve(QR.B, cc) : solve里的'a'是奇异矩阵。                                                   Error in nls(y ~ 1/(1 + exp((xmid - x)/scal)), data = xy, start = list(xmid = aux[[1L]], :循环次数超过了50这个最大值。-决策链社区论坛
预测器SE:Error: Measure ’classif.acc‘ incompatible with task type 'sury‘-决策链社区论坛

预测器SE:Error: Measure ’classif.acc‘ incompatible with task type ‘sury‘

错误原因: 机器学习生存模型没有ACC的评估方法,只有分类模型才有 解决方法: 修改模型类型,以及评估方法  
空鱼O的头像-决策链社区论坛空鱼O4个月前
07614