版權說明:本文檔由用戶提供并上傳,收益歸屬內容提供方,若內容存在侵權,請進行舉報或認領
文檔簡介
統(tǒng)計建模與R軟件課后習題答案2-5章統(tǒng)計建模與R軟件課后習題答案2-5章統(tǒng)計建模與R軟件課后習題答案2-5章資料僅供參考文件編號:2022年4月統(tǒng)計建模與R軟件課后習題答案2-5章版本號:A修改號:1頁次:1.0審核:批準:發(fā)布日期:
R,從零水平開始。國內真的沒有一本像樣的R教科書??!勉強用用薛毅編的《統(tǒng)計建模與R軟件》吧,找不出更好的了……
工作環(huán)境仍是linux。
第二章答案:
x<-c(1,2,3)
y<-c(4,5,6)
e<-c(1,1,1)
z=2*x+y+e
z1=crossprod(x,y)#z1為x1與x2的內積或者x%*%y
z2=tcrossprod(x,y)#z1為x1與x2的外積或者x%o%y
z;z1;z2
要點:基本的列表賦值方法,內積和外積概念。內積為標量,外積為矩陣。
A<-matrix(1:20,c(4,5));A
B<-matrix(1:20,nrow=4,byrow=TRUE);B
C=A+B;C
#不存在AB這種寫法
E=A*B;E
F<-A[1:3,1:3];F
H<-matrix(c(1,2,4,5),nrow=1);H
#H起過渡作用,不規(guī)則的數(shù)組下標
G<-B[,H];G
要點:矩陣賦值方法。默認是byrow=FALSE,數(shù)據(jù)按列放置。
取出部分數(shù)據(jù)的方法??梢杂脭?shù)組作為數(shù)組的下標取出數(shù)組元素。
x<-c(rep(1,times=5),rep(2,times=3),rep(3,times=4),rep(4,times=2));x#或者省略times=,如下面的形式
x<-c(rep(1,5),rep(2,3),rep(3,4),rep(4,2));x
要點:rep()的使用方法。rep(a,b)即將a重復b次
n<-5;H<-array(0,dim=c(n,n))
for(iin1:n){for(jin1:n){H[i,j]<-1/(i+j-1)}};H
G<-solve(H);G#求H的逆矩陣
ev<-eigen(H);ev#求H的特征值和特征向量
要點:數(shù)組初始化;for循環(huán)的使用
待解決:如何將很長的命令(如for循環(huán))用幾行打出來再執(zhí)行每次想換行的時候一按回車就執(zhí)行了還沒打完的命令...
StudentData<(name=c("zhangsan","lisi","wangwu","zhaoliu","dingyi"),sex=c("F","M","F","M","F"),age=c("14","15","16","14","15"),height=c("156","165","157","162","159"),weight=c("42","49","","52",""));StudentData
要點:數(shù)據(jù)框的使用
待解決:SSH登陸linux服務器中文顯示亂碼。此處用英文代替。
(StudentData,file="")
#把數(shù)據(jù)框StudentData在工作目錄里輸出,輸出的文件名為.
StudentData_a<("");StudentData_a
#以數(shù)據(jù)框的形式讀取文檔,存入數(shù)據(jù)框StudentData_a中。
(StudentData_a,"")
#把數(shù)據(jù)框StudentData_a在工作目錄里輸出,輸出的文件名為,可用Excel打開.
要點:讀寫文件。("file")
(Rdata,"file")
("file")
(Rdata,"file")
外部文件,不論是待讀入或是要寫出的,命令中都得加雙引號。
Fun<-function(n){
if(n<=0)
list(fail="pleaseinputaintegerabove0!")
else{
repeat{
if(n==1)break
elseif(n%%2==0){n<-n/2}
elsen<-3*n+1
}
list("sucess!")
}
}
在linux下新建一個R文件,輸入上述代碼,保存為""
然后在當前目錄下進入R環(huán)境,輸入source(""),即打開了這個程序腳本。
然后就可以執(zhí)行函數(shù)了。
輸入Fun(67),顯示
"sucess!"
輸入Fun(-1),顯示
$fail
[1]"pleaseinputaintegerabove0!"
待解決:source("*.R")是可以理解為載入這個R文件吧如何在R環(huán)境下關閉R文件呢?
OK,自己寫的第一個R程序~~第二章答案:
x<-c(1,2,3)
y<-c(4,5,6)
e<-c(1,1,1)
z=2*x+y+e
z1=crossprod(x,y)#z1為x1與x2的內積或者x%*%y
z2=tcrossprod(x,y)#z1為x1與x2的外積或者x%o%y
z;z1;z2
要點:基本的列表賦值方法,內積和外積概念。內積為標量,外積為矩陣。
A<-matrix(1:20,c(4,5));A
B<-matrix(1:20,nrow=4,byrow=TRUE);B
C=A+B;C
#不存在AB這種寫法
E=A*B;E
F<-A[1:3,1:3];F
H<-matrix(c(1,2,4,5),nrow=1);H
#H起過渡作用,不規(guī)則的數(shù)組下標
G<-B[,H];G
要點:矩陣賦值方法。默認是byrow=FALSE,數(shù)據(jù)按列放置。
取出部分數(shù)據(jù)的方法??梢杂脭?shù)組作為數(shù)組的下標取出數(shù)組元素。
x<-c(rep(1,times=5),rep(2,times=3),rep(3,times=4),rep(4,times=2));x#或者省略times=,如下面的形式
x<-c(rep(1,5),rep(2,3),rep(3,4),rep(4,2));x
要點:rep()的使用方法。rep(a,b)即將a重復b次
n<-5;H<-array(0,dim=c(n,n))
for(iin1:n){for(jin1:n){H[i,j]<-1/(i+j-1)}};H
G<-solve(H);G#求H的逆矩陣
ev<-eigen(H);ev#求H的特征值和特征向量
要點:數(shù)組初始化;for循環(huán)的使用
待解決:如何將很長的命令(如for循環(huán))用幾行打出來再執(zhí)行每次想換行的時候一按回車就執(zhí)行了還沒打完的命令...
StudentData<(name=c("zhangsan","lisi","wangwu","zhaoliu","dingyi"),sex=c("F","M","F","M","F"),age=c("14","15","16","14","15"),height=c("156","165","157","162","159"),weight=c("42","49","","52",""));StudentData
要點:數(shù)據(jù)框的使用
待解決:SSH登陸linux服務器中文顯示亂碼。此處用英文代替。
(StudentData,file="")
#把數(shù)據(jù)框StudentData在工作目錄里輸出,輸出的文件名為.
StudentData_a<("");StudentData_a
#以數(shù)據(jù)框的形式讀取文檔,存入數(shù)據(jù)框StudentData_a中。
(StudentData_a,"")
#把數(shù)據(jù)框StudentData_a在工作目錄里輸出,輸出的文件名為,可用Excel打開.
要點:讀寫文件。("file")
(Rdata,"file")
("file")
(Rdata,"file")
外部文件,不論是待讀入或是要寫出的,命令中都得加雙引號。
Fun<-function(n){
if(n<=0)
list(fail="pleaseinputaintegerabove0!")
else{
repeat{
if(n==1)break
elseif(n%%2==0){n<-n/2}
elsen<-3*n+1
}
list("sucess!")
}
}
在linux下新建一個R文件,輸入上述代碼,保存為""
然后在當前目錄下進入R環(huán)境,輸入source(""),即打開了這個程序腳本。
然后就可以執(zhí)行函數(shù)了。
輸入Fun(67),顯示
"sucess!"
輸入Fun(-1),顯示
$fail
[1]"pleaseinputaintegerabove0!"
待解決:source("*.R")是可以理解為載入這個R文件吧如何在R環(huán)境下關閉R文件呢?
新建txt文件如下:
編寫一個函數(shù)(程序名為)描述樣本的各種描述性統(tǒng)計量。
data_outline<-function(x){
n<-length(x)
m<-mean(x)
v<-var(x)
s<-sd(x)
me<-median(x)
cv<-100*s/m
css<-sum((x-m)^2)
uss<-sum(x^2)
R<-max(x)-min(x)
R1<-quantile(x,3/4)-quantile(x,1/4)
sm<-s/sqrt(n)
g1<-n/((n-1)*(n-2))*sum((x-m)^3)/s^3
g2<-((n*(n+1))/((n-1)*(n-2)*(n-3))*sum((x-m)^4)/s^4-(3*(n-1)^2)/((n-2)*(n-3)))
(N=n,Mean=m,Var=v,std_dev=s,Median=me,std_mean=sm,CV=cv,CSS=css,USS=uss,R=R,R1=R1,Skewness=g1,Kurtosis=g2,=1)
}
進入R,
source("")#將程序調入內存
serumdata<-scan("");serumdata#將數(shù)據(jù)讀入向量serumdata。
data_outline(serumdata)
結果如下:
NMeanVarstd_devMedianstd_meanCVCSSUSSR
110020
R1SkewnessKurtosis
1
要點:()用于讀表格形式的文件。上述形式的數(shù)據(jù)由于第七行缺幾個數(shù)據(jù),故用()不能讀入。scan()可以直接讀純文本文件。scan()和matrix()連用還可以將數(shù)據(jù)存放成矩陣形式。X<-matrix(scan("",0),ncol=10,byrow=TRUE)#將上述數(shù)據(jù)放置成10*10的矩陣。
scan()還可以從屏幕上直接輸入數(shù)據(jù)。
Y<-scan()
然后按提示輸入即可。結束輸入時按回車即可。
>hist(serumdata,freq=FALSE,col="purple",border="red",density=3,angle=60,main=paste("thehistogramofserumdata"),xlab="age",ylab="frequency")#直方圖。col是填充顏色。默認空白。border是邊框的顏色,默認前景色。density是在圖上畫條紋陰影,默認不畫。angle是條紋陰影的傾斜角度(逆時針方向),默認45度。main,xlab,ylab是標題,x和y坐標軸名稱。
>lines(density(serumdata),col="blue")#密度估計曲線。
>x<-64:85
>lines(x,dnorm(x,mean(serumdata),sd(serumdata)),col="green")#正態(tài)分布的概率密度曲線
>plot(ecdf(serumdata),verticals=TRUE,=FALSE)#繪制經(jīng)驗分布圖
>lines(x,pnorm(x,mean(serumdata),sd(serumdata)),col="blue")#正態(tài)經(jīng)驗分布
>qqnorm(serumdata,col="purple")#繪制QQ圖
>qqline(serumdata,col="red")#繪制QQ直線
>stem(serumdata,scale=1)#作莖葉圖。原始數(shù)據(jù)小數(shù)點后數(shù)值四舍五入。
Thedecimalpointisatthe|
64|300
66|23333
68|00888777
70|222
72|000000055
74|04688888
76|26
78|0888555
80|355266
82|
84|3
>boxplot(serumdata,col="lightblue",notch=T)#作箱線圖。notch表示帶有缺口。
>fivenum(serumdata)#五數(shù)總結
[1]
>(serumdata)#正態(tài)性Shapori-Wilk檢驗方法
Shapiro-Wilknormalitytest
data:serumdata
W=,p-value=
結論:p值>,可認為來自正態(tài)分布的總體。
>(serumdata,"pnorm",mean(serumdata),sd(serumdata))#Kolmogrov-Smirnov檢驗,正態(tài)性
One-sampleKolmogorov-Smirnovtest
data:serumdata
D=,p-value=
alternativehypothesis:two-sided
Warningmessage:
In(serumdata,"pnorm",mean(serumdata),sd(serumdata)):
cannotcomputecorrectp-valueswithties
結論:p值>,可認為來自正態(tài)分布的總體。
注意,這里的警告信息,是因為數(shù)據(jù)中有重復的數(shù)值,ks檢驗要求待檢數(shù)據(jù)時連續(xù)的,不允許重復值。
>y<-c(2,4,3,2,4,7,7,2,2,5,4,5,6,8,5,10,7,12,12,6,6,7,11,6,6,7,9,5,5,10,6,3,10)#輸入數(shù)據(jù)
>f<-factor(c(rep(1,11),rep(2,10),rep(3,12)))#因子分類
>plot(f,y,col="lightgreen")#plot()生成箱線圖
>x<-c(2,4,3,2,4,7,7,2,2,5,4)
>y<-c(5,6,8,5,10,7,12,12,6,6)
>z<-c(7,11,6,6,7,9,5,5,10,6,3,10)
>boxplot(x,y,z,names=c("1","2","3"),col=c(5,6,7))#boxplot()生成箱線圖
結論:第2和第3組沒有顯著差異。第1組合其他兩組有顯著差異。
數(shù)據(jù)太多,懶得錄入。離散圖應該用plot即可。
>studata<("")#讀入數(shù)據(jù)
>(studata)#轉化為數(shù)據(jù)框
V1V2V3V4V5V6
11alicef13
22beckaf13
33gailf14
44karenf12
55kathyf12
66maryf15
77sandyf11
88sharonf15
99tammyf14
1010alfredm14
1111dukem14
1212guidom15
1313jamesm12
1414jefferym13
1515johnm12
1616philipm16
1717robertm12
1818thomasm11
1919williamm15
>names(studata)<-c("stuno","name","sex","age","height","weight"),studata#給各列命名
stunonamesexageheightweight
11alicef13
22beckaf13
33gailf14
...
>attach(studata)#將數(shù)據(jù)框調入內存
>plot(weight~height,col="red")#體重對于身高的散點圖
>coplot(weight~height|sex,col="blue")#不同性別,體重與身高的散點圖
>coplot(weight~height|age,col="blue")#不同年齡,體重與身高的散點圖
>coplot(weight~height|age+sex,col="blue")#不同年齡和性別,體重與身高的散點圖
>x<-seq(-2,3,
>y<-seq(-1,7,
>f<-function(x,y)x^4-2*x^2*y+x^2-2*x*y+2*y^2+*x-4*y+4
>z<-outer(x,y,f)#必須做外積運算才能繪出三維圖形
>contour(x,y,z,levels=c(0,1,2,3,4,5,10,15,20,30,40,50,60,80,100),col="blue")#二維等值線
>persp(x,y,z,theta=120,phi=0,expand=,col="lightblue")#三位網(wǎng)格曲面
>attach(studata)
>(height,weight)#Pearson相關性檢驗
Pearson'sproduct-momentcorrelation
data:heightandweight
t=,df=17,p-value=
alternativehypothesis:truecorrelationisnotequalto0
95percentconfidenceinterval:
sampleestimates:
cor
由此可見身高和體重是相關的。
指數(shù)分布,λ的極大似然估計是n/sum(Xi)
>x<-c(rep(5,365),rep(15,245),rep(25,150),rep(35,100),rep(45,70),rep(55,45),rep(65,25))
>lamda<-length(x)/sum(x);lamda
[1]
Poisson分布P(x=k)=λ^k/k!*e^(-λ)
其均數(shù)和方差相等,均為λ,其含義為平均每升水中大腸桿菌個數(shù)。
取均值即可。
>x<-c(rep(0,17),rep(1,20),rep(2,10),rep(3,2),rep(4,1))
>mean(x)
[1]1
平均為1個。
>obj<-function(x){f<-c(-13+x[1]+((5-x[2])*x[2]-2)*x[2],-29+x[1]+((x[2]+1)*x[2]-14)*x[2]);sum(f^2)}#其實我也不知道這是在干什么。所謂的無約束優(yōu)化問題。
>x0<-c,-2)
>nlm(obj,x0)
$minimum
[1]
$estimate
[1]
$gradient
[1]
$code
[1]1
$iterations
[1]16
>x<-c(54,67,68,78,70,66,67,70,65,69)
>(x)#()做單樣本正態(tài)分布區(qū)間估計
OneSamplet-test
data:x
t=,df=9,p-value=
alternativehypothesis:truemeanisnotequalto0
95percentconfidenceinterval:
sampleestimates:
meanofx
平均脈搏點估計為,95%區(qū)間估計為。
>(x,alternative="less",mu=72)#()做單樣本正態(tài)分布單側區(qū)間估計
OneSamplet-test
data:x
t=,df=9,p-value=
alternativehypothesis:truemeanislessthan72
95percentconfidenceinterval:
-Inf
sampleestimates:
meanofx
p值小于,拒絕原假設,平均脈搏低于常人。
要點:()函數(shù)的用法。本例為單樣本;可做雙邊和單側檢驗。
>x<-c(140,137,136,140,145,148,140,135,144,141);x
[1]140137136140145148140135144141
>y<-c(135,118,115,140,128,131,130,115,131,125);y
[1]135118115140128131130115131125
>(x,y,=TRUE)
TwoSamplet-test
data:xandy
t=,df=18,p-value=
alternativehypothesis:truedifferenceinmeansisnotequalto0
95percentconfidenceinterval:
sampleestimates:
meanofxmeanofy
期望差的95%置信區(qū)間為。
要點:()可做兩正態(tài)樣本均值差估計。此例認為兩樣本方差相等。
ps:我怎么覺得這題應該用配對t檢驗?
>x<-c,,,
>y<-c,,,,
>(x,y,=TRUE)
TwoSamplet-test
data:xandy
t=,df=7,p-value=
alternativehypothesis:truedifferenceinmeansisnotequalto0
95percentconfidenceinterval:
sampleestimates:
meanofxmeanofy
期望差的95%的區(qū)間估計為
接
>(x,y)
Ftesttocomparetwovariances
data:xandy
F=,numdf=9,denomdf=9,p-value=
alternativehypothesis:trueratioofvariancesisnotequalto1
95percentconfidenceinterval:
0.
sampleestimates:
ratioofvariances
要點:可做兩樣本方差比的估計?;诖私Y果可認為方差不等。
因此,在中,計算期望差時應該采取方差不等的參數(shù)。
>(x,y)
WelchTwoSamplet-test
data:xandy
t=,df=,p-value=
alternativehypothesis:truedifferenceinmeansisnotequalto0
95percentconfidenceinterval:
sampleestimates:
meanofxmeanofy
期望差的95%置信區(qū)間為。
要點:(x,y,=TRUE)做方差相等的兩正態(tài)樣本的均值差估計
(x,y)做方差不等的兩正態(tài)樣本的均值差估計
>x<-c(rep(0,7),rep(1,10),rep(2,12),rep(3,8),rep(4,3),rep(5,2))
>n<-length(x)
>tmp<-sd(x)/sqrt(n)*qnorm2)
>mean(x)
[1]
>mean(x)-tmp;mean(x)+tmp
[1]
[1]
平均呼喚次數(shù)為
的置信區(qū)間為,2,32
>x<-c(1067,919,1196,785,1126,936,918,1156,920,948)
>(x,alternative="greater")
OneSamplet-test
data:x
t=,df=9,p-value=
alternativehypothesis:truemeanisgreaterthan0
95percentconfidenceinterval:
Inf
sampleestimates:
meanofx
燈泡平均壽命置信度95%的單側置信下限為
要點:()做單側置信區(qū)間估計
統(tǒng)計建模與R軟件第五章習題答案(假設檢驗)
>x<-c(220,188,162,230,145,160,238,188,247,113,126,245,164,231,256,183,190,158,224,175)
>(x,mu=225)
OneSamplet-test
data:
x
t=,df=19,p-value=
alternativehypothesis:truemeanisnotequalto225
95percentconfidenceinterval:
sampleestimates:
meanofx
原假設:油漆工人的血小板計數(shù)與正常成年男子無差異。
備擇假設:油漆工人的血小板計數(shù)與正常成年男子有差異。
p值小于,拒絕原假設,認為油漆工人的血小板計數(shù)與正常成年男子有差異。
上述檢驗是雙邊檢驗。也可采用單邊檢驗。備擇假設:油漆工人的血小板計數(shù)小于正常成年男子。
>(x,mu=225,alternative="less")
OneSamplet-test
data:
x
t=,df=19,p-value=
alternativehypothesis:truemeanislessthan225
95percentconfidenceinterval:
-Inf
sampleestimates:
meanofx
同樣可得出油漆工人的血小板計數(shù)小于正常成年男子的結論。
>pnorm(1000,mean(x),sd(x))
[1]
>x
[1]1067
9191196
7851126
936
9181156
920
948
>pnorm(1000,mean(x),sd(x))
[1]
x<=1000的概率為,故x大于1000的概率為.
要點:pnorm計算正態(tài)分布的分布函數(shù)。在R軟件中,計算值均為下分位點。
>A<-c(113,120,138,120,100,118,138,123)
>B<-c(138,116,125,136,110,132,130,110)
>(A,B,paired=TRUE)
Pairedt-test
data:
AandB
t=,df=7,p-value=
alternativehypothesis:truedifferenceinmeansisnotequalto0
95percentconfidenceinterval:
sampleestimates:
meanofthedifferences
p值大于,接受原假設,兩種方法治療無差異。
(1)
正態(tài)性W檢驗:
>x<-c,,2,,,,4,,,,,,,3,,,,,6,
>y<-c,,5,,,,,,,,6,,2,,2,,,,,-2)
>(x)
Shapiro-Wilknormalitytest
data:
x
W=,p-value=
>(y)
Shapiro-Wilknormalitytest
data:
y
W=,p-value=
ks檢驗:
>(x,"pnorm",mean(x),sd(x))
One-sampleKolmogorov-Smirnovtest
data:
x
D=,p-value=
alternativehypothesis:two-sided
Warningmessage:
In(x,"pnorm",mean(x),sd(x)):
cannotcomputecorrectp-valueswithties
>(y,"pnorm",mean(y),sd(y))
One-sampleKolmogorov-Smirnovtest
data:
y
D=,p-value=
alternativehypothesis:two-sided
Warningmessage:
In(y,"pnorm",mean(y),sd(y)):
cannotcomputecorrectp-valueswithties
pearson擬合優(yōu)度檢驗,以x為例。
>sort(x)
[1]
[16]
>x1<-table(cut(x,br=c(-6,-3,0,3,6,9)))
>p<-pnorm(c(-3,0,3,6,9),mean(x),sd(x))
>p
[1]0.0.0.0.
>p<-c(p[1],p[2]-p[1],p[3]-p[2],p[4]-p[3],1-p[4]);p
[1]0.0.0.
>(x1,p=p)
Chi-squaredtestforgivenprobabilities
data:
x1
X-squared=,df=4,p-value=
Warningmessage:
In(x1,p=p):Chi-squaredapproximationmaybeincorrect
p值為,接受原假設,x符合正態(tài)分布。
(2)
方差相同模型t檢驗:
>(x,y,=TRUE)
TwoSamplet-test
data:
xandy
t=,df=38,p-value=
alternativehypothesis:truedifferenceinmeansisnotequalto0
95percentconfidenceinterval:
sampleestimates:
meanofxmeanofy
方差不同模型t檢驗:
>(x,y)
WelchTwoSamplet-test
data:
xandy
t=,df=,p-value=
alternativehypothesis:truedifferenceinmeansisnotequalto0
95percentconfidenceinterval:
sampleestimates:
meanofxmeanofy
配對t檢驗:
>(x,y,paired=TRUE)
Pairedt-test
data:
xandy
t=,df=19,p-value=
alternativehypothesis:truedifferenceinmeansisnotequalto0
95percentconfidenceinterval:
sampleestimates:
meanofthedifferences
三種檢驗的結果都顯示兩組數(shù)據(jù)均值無差異。
(3)
方差檢驗:
>(x,y)
Ftesttocomparetwovariances
data:
xandy
F=,numdf=19,denomdf=19,p-value=
alternativehypothesis:trueratioofvariancesisnotequalto1
95percentconfidenceinterval:
sampleestimates:
ratioofvariances
接受原假設,兩組數(shù)據(jù)方差相同。
>a<-c(126,125,136,128,123,138,142,116,110,108,115,140)
>b<-c(162,172,177,170,175,152,157,159,160,162)
正態(tài)性檢驗,采用ks檢驗:
>(a,"pnorm",mean(a),sd(a))
One-sampleKolmogorov-Smirnovtest
data:
a
D=,p-value=
alternativehypothesis:two-sided
>(b,"pnorm",mean(b),sd(b))
One-sampleKolmogorov-Smirnovtest
data:
b
D=,p-value=
alternativehypothesis:two-sided
Warningmessage:
In(b,"pnorm",mean(b),sd(b)):
cannotcomputecorrectp-valueswithties
a和b都服從正態(tài)分布。
方差齊性檢驗:
>(a,b)
Ftesttocomparetwovariances
data:
aandb
F=,numdf=11,denomdf=9,p-value=
alternativehypothesis:trueratioofvariancesisnotequalto1
95percentconfidenceinterval:
sampleestimates:
ratioofvariances
可認為a和b的方差相同。
選用方差相同模型t檢驗:
>(a,b,=TRUE)
TwoSamplet-test
data:
aandb
t=,df=20,p-value=
alternativehypothesis:truedifferenceinmeansisnotequalto0
95percentconfidenceinterval:
sampleestimates:
meanofxmeanofy
可認為兩者有差別。
二項分布總體的假設檢驗:
>(57,400,p=
Exactbinomialtest
data:
57and400
numberofsuccesses=57,numberoftrials=400,p-value=
alternativehypothesis:trueprobabilityofsuccessisnotequalto
95percentconfidenceinterval:
sampleestimates:
probabilityofsuccess
P值>,故接受原假設,表示調查結果支持該市老年人口的看法
二項分布總體的假設檢驗:
>(178,328,p=,alternative="greater")
Exactbinomialtest
data:
178and328
numberofsuccesses=178,numberoftrials=328,p-value=
alternativehypothesis:trueprobabilityofsuccessisgreaterthan
95percentconfidenceinterval:
sampleestimates:
probabilityofsuccess
不能認為這種處理能增加母雞的比例。
利用pearson卡方檢驗是否符合特定分布:
>(c(315,101,108,32),p=c(9,3,3,1)/16)
Chi-squaredtestforgivenprobabilities
data:
c(315,101,108,32)
X-squared=,df=3,p-value=
接受原假設,符合自由組合定律。
利用pearson卡方檢驗是否符合泊松分布:
>n<-length(z)
>y<-c(92,68,28,11,1,0)
>x<-0:5
>q<-ppois(x,mean(rep(x,y)));n<-length(y)
>p[1]<-q[1];p[n]=1-q[n-1]
>(y,p=p)
Chi-squaredtestforgivenprobabilities
data:
y
X-squared=,df=5,p-value=
Warningmessage:
In(y,p=p):Chi-squaredapproximationmaybeincorrect
重新分組,合并頻數(shù)小于5的組:
>z<-c(92,68,28,12)
>n<-length(z);p<-p[1:n-1];p[n]<-1-q[n-1]
>(z,p=p)
Chi-squaredtestforgivenprobabilities
data:
z
X-squared=,df=3,p-value=
可認為數(shù)據(jù)服從泊松分布。
ks檢驗兩個分布是否相同:
>x<-c,,752,,,,,
>y<-c,,,,,
>(x,y)
Two-sampleKolmogorov-Smirnovtest
data:
xandy
D=,p-value=
alternativehypothesis:two-sided
列聯(lián)數(shù)據(jù)的獨立性檢驗:
>x<-c(358,2492,229,2745)
>dim(x)<-c(2,2)
>(x)
Pearson'sChi-squaredtestwithYates'continuitycorrection
data:
x
X-squared=,df=1,p-value=
P值<,拒絕原假設,有影響。
列聯(lián)數(shù)據(jù)的獨立性檢驗:
>y
[,1][,2][,3]
[1,]
45
12
10
[2,]
46
20
28
[3,]
28
23
30
[4,]
11
12
35
>(y)
Pearson'sChi-squaredtest
data:
y
X-squared=,df=6,p-value=
P值<,拒絕原假設,不獨立,有關系。
因有的格子的頻數(shù)小于5,故采用fiser確切概率法檢驗獨立性。
>(x)
Fisher'sExactTestforCountData
data:
x
p-value=
alternativehypothesis:trueoddsratioisnotequalto1
95percentconfidenceinterval:
5.
sampleestimates:
oddsratio
p值大于,兩變量獨立,兩種工藝對產(chǎn)品的質量沒有影響。
由于是在相同個體上的兩次試驗,故采用McNemar檢驗。
>(x)
McNemar'sChi-squaredtest
data:
x
McNemar'schi-squared=,df=3,p-value=
p值大于,不能認定兩種方法測定結果不同。
符號檢驗:
H0:中位數(shù)>=;
H1:中位數(shù)<
>x<-c,,,,,,,,,
>(sum(x)>,length(x),al="l")
Exactbinomialtest
data:
sum(x)>andlength(x)
numberofsuccesses=1,numberoftrials=10,p-value=
alternativehypothesis:trueprobabilityofsuccessislessthan
95percentconfidenceinterval:
sampleestimates:
probabilityofsuccess
拒絕原假設,中位數(shù)小于
Wilcoxon符號秩檢驗:
>(x,mu=,al="l",exact=F)
Wilcoxonsignedranktestwithcontinuitycorrection
data:
x
V=,p-value=
alternativehypothesis:truelocationislessthan
拒絕原假設,中位數(shù)小于
符號檢驗法:
>x<-c(48,33,,48,,40,42,36,,22,36,,,,52,38,,20,21,
>y<-c(37,41,,17,,40,31,36,,,21,,,,,28,,20,11,
>(sum(x>y),length(x))
Exactbinomialtest
data:
sum(x>y)andlength(x)
numberofsuccesses=14,numberoftrials=20,p-value=
alternativehypothesis:trueprobabilityofsuccessisnotequalto
95percentconfidenceinterval:
sampleestimates:
probabilityofsuccess
接受原假設,
溫馨提示
- 1. 本站所有資源如無特殊說明,都需要本地電腦安裝OFFICE2007和PDF閱讀器。圖紙軟件為CAD,CAXA,PROE,UG,SolidWorks等.壓縮文件請下載最新的WinRAR軟件解壓。
- 2. 本站的文檔不包含任何第三方提供的附件圖紙等,如果需要附件,請聯(lián)系上傳者。文件的所有權益歸上傳用戶所有。
- 3. 本站RAR壓縮包中若帶圖紙,網(wǎng)頁內容里面會有圖紙預覽,若沒有圖紙預覽就沒有圖紙。
- 4. 未經(jīng)權益所有人同意不得將文件中的內容挪作商業(yè)或盈利用途。
- 5. 人人文庫網(wǎng)僅提供信息存儲空間,僅對用戶上傳內容的表現(xiàn)方式做保護處理,對用戶上傳分享的文檔內容本身不做任何修改或編輯,并不能對任何下載內容負責。
- 6. 下載文件中如有侵權或不適當內容,請與我們聯(lián)系,我們立即糾正。
- 7. 本站不保證下載資源的準確性、安全性和完整性, 同時也不承擔用戶因使用這些下載資源對自己和他人造成任何形式的傷害或損失。
最新文檔
- 樹木鋼支撐施工方案
- 韓國機械工學課程設計
- 2025年校園小賣部租賃合同及特色商品引進協(xié)議2篇
- 2025年度園藝中心綠植花卉租賃及銷售合作協(xié)議4篇
- 二零二四年醫(yī)療人員培訓與交流合同3篇
- 二零二五版車輛抵押反擔保服務協(xié)議書3篇
- 2025年度插畫師與動畫制作公司合同4篇
- 2025年度快遞代收代付服務合同模板4篇
- 二零二五年度臨時聘用合同-國際商務談判團隊臨時聘用協(xié)議4篇
- 二零二五版不銹鋼家具設計與定制服務合同3篇
- 【人教版】九年級化學上冊期末試卷及答案【【人教版】】
- 四年級數(shù)學上冊期末試卷及答案【可打印】
- 人教版四年級數(shù)學下冊課時作業(yè)本(含答案)
- 中小學人工智能教育方案
- 高三完形填空專項訓練單選(部分答案)
- 護理查房高鉀血癥
- 項目監(jiān)理策劃方案匯報
- 《職業(yè)培訓師的培訓》課件
- 建筑企業(yè)新年開工儀式方案
- 營銷組織方案
- 初中英語閱讀理解專項練習26篇(含答案)
評論
0/150
提交評論