- html - 出于某种原因,IE8 对我的 Sass 文件中继承的 html5 CSS 不友好?
- JMeter 在响应断言中使用 span 标签的问题
- html - 在 :hover and :active? 上具有不同效果的 CSS 动画
- html - 相对于居中的 html 内容固定的 CSS 重复背景?
我有数据
N11.1 N22.2 N33.1 N44.1 N21.1 N31.1 N32.1
Sinus 1 0 0 0.0 0 0 12.0
ArrAHB 1 0 0 0.1 0 0 20.9
ID
值
Sinus
和
ArrAHB
.
require(lattice)
Sinus<-c(1,0,0,0,0,0,12)
ArrAHB<-c(1,0,0,0.1,0,0,20.9)
Labels<-c("N11.1","N22.2","N33.1","N44.1","N21.1","N31.1","N32.1")
ID<-c("Sinus","Arr/AHB")
data.female<-data.frame(Sinus,ArrAHB,row.names=Labels)
data.female<-t(data.female)
> data.female$ID<-ID
Warning message:
In data.female$ID <- ID : Coercing LHS to a list
Why does the creation of the ID column cause the coercion in the data.frame?
barchart(N11.1+N22.1+N33.1+N44.1+N21.1+N31.1+N32.1 ~ ID, data=data.female)
这需要一个新的 ID 列
here ,我不明白为什么这个 ID 添加有时有效,有时无效。请解释。
最佳答案
它发出警告,作为转置的结果 t()
是一个矩阵。矩阵没有可访问的列名。在进行 ID 分配之前,您必须使用 as.data.frame()
将矩阵强制转换为数据框。
这有效。
Sinus<-c(1,0,0,0,0,0,12)
ArrAHB<-c(1,0,0,0.1,0,0,20.9)
Labels<-c("N11.1","N22.2","N33.1","N44.1","N21.1","N31.1","N32.1")
ID<-c("Sinus","Arr/AHB")
data.female<-data.frame(Sinus,ArrAHB,row.names=Labels)
data.female<-as.data.frame(t(data.female))
data.female$ID<-ID
关于R: `ID : Coercing LHS to a list` 在添加 ID 列中,为什么?,我们在Stack Overflow上找到一个类似的问题: https://stackoverflow.com/questions/40681628/
考虑以下 GHCi session : >:set -XTypeApplications >import Data.Map.Strict >import GHC.Exts >newtype MySet
我有一个类型 Id a我试图防止意外强制,例如 Id Double到 Id Int . 如果我正确理解类型角色,则以下内容不应编译。 {-# LANGUAGE RoleAnnotations #-}
在inline-c包中,有一个example从 Haskell 调用 C 库 GNU Scientific Library gsl。 solveOde fun x0 f0 xend = coerc
在inline-c包中,有一个example从 Haskell 调用 C 库 GNU Scientific Library gsl。 solveOde fun x0 f0 xend = coerc
我相信以下内容与 Set.mapMonotonic coerce 一样安全.即可能发生的最坏情况是我将打破 Set不变量 a或 b有不同的Ord实例: coerceSet :: Coercible a
我有一个 Django 项目,其中包含两个功能性应用程序。今天,在添加两个新模型后,我意识到我的一个应用程序坏了。当我尝试向任何模型添加实例时,我收到与数据类型相关的错误。当我尝试在应用程序中创建任何
func downloadCurrentWeather(completed: @escaping DownloadComplete){ Alamofire.request(API_URL).r
我尝试直接对解释执行此操作: (setf example (coerce "blablabla" 'list)) 并且工作正常。事实上 (car example) 返回 #\b 但如果我尝试这样做:
我收到TypeError: coercing to Unicode: need string or buffer, int found 这是我的模型.py: class FollowingModel(
Python 内置的 coerce 函数有哪些常见用途?如果我不知道数值 as per the documentation 的 type,我可以看到应用它,但是否存在其他常见用法?我猜想在执行算术计算
考虑这种类型: data Vec3 = Vec3 {_x, _y, _z :: Int} 我有一些函数都采用相同的输入,并且可能无法计算字段: data Input getX, getY, getZ
我对 R 的理解正在不断进步,但在投资组合优化方面我遇到了另一个障碍。我有一个程序可以生成 Assets 组合的 .csv 文件。第一个是投资组合的方差/协方差矩阵:covar.csv,第二个是 As
我有以下 Haskell 代码,可以完美编译: import Control.Monad.Reader (Reader (..)) import Data.Coerce (Coercible, coe
我目前正在自学 Swift 编程,但遇到了一条我不知道如何摆脱的错误消息。错误消息如下: warning: expression implicitly coerced from 'String?' t
这个问题已经有答案了: coerce() equivalent in python 3 (2 个回答) What is Python's coerce() used for? (2 个回答) 已关闭
coerce() 函数 returns a tuple consisting of the two numeric arguments converted to a common type, usin
我有以下函数来为给定用户汇总我的 Pack 模型中 :amount 字段的所有记录: 用户.rb def total_money_spent_cents amount = self.pac
在我的程序中,我收到一条错误消息,显示 ./ruby_camping.rb:91:in `-': nil can't be coerced into Fixnum (TypeError)。我想做的是为
据说当我们有一个类 Point 并且知道如何执行 point * 3 时,如下所示: class Point def initialize(x,y) @x, @y = x, y end
我正在尝试获取lambda值,我发现了以下问题:R glmnet : "(list) object cannot be coerced to type 'double' " 但是无法弄清楚如何使其适用
我是一名优秀的程序员,十分优秀!