臨床統計もおもしろいですよ、その2at HOSP
臨床統計もおもしろいですよ、その2 - 暇つぶし2ch418: under curve) Wtotal=ifelse(2*d<b,9/4*a*d^4,a/36*(b+d)^3/(b-d)*(4*b*d-b^2-d^2)) ; Wtotal Wq=Wt/N ; Wq



419:卵の名無しさん
18/11/30 14:22:24.86 c4eruZjZ.net
数式を追うだけだと身につかないからプログラムに入力して自分でグラフを書いてみると理解が捗る。
自分がどこができていないもよく分かる。必要な計算ができないとグラフが完成できないから。
プログラムしておくとあとで数値を変えて再利用できるのが( ・∀・)イイ!!
URLリンク(i.imgur.com)

420:卵の名無しさん
18/11/30 21:39:40.37 kXCX0lfh.net
Prudence, indeed, will dictate that "uraguchi" long established cannot be changed for light and transient causes;
and accordingly all experience has shown, that BMS are more disposed to suffer, while evils are sufferable, than to right themselves by abolishing the forms from which they can pursue profit.
But when a long train of misbehavior and misconduct , showing invariably the same Imbecility evinces a design to reveal themselves as absolute Bona Fide Moron ,
it is their right, it is their duty, to expel such "uraguchi", and to provide new guards for their future security.

421:卵の名無しさん
18/11/30 23:12:28.51 c4eruZjZ.net
#
source('tmp.tools.R') # 乱数発生にNeumann法
# 受付時間9:00-12:30,15:30-19:00
curve(10*(dgamma(x-9,2,1)+dgamma(x-16,8,5)),9,20,type='h') # 雛形
R <- function(x) ifelse((9<x&x<12.5)|(15.5<x&x<19),dgamma(x-9,2,1)+dgamma(x-16,8,5),0)
set.seed(123) ; data=vonNeumann2(function(x) R(x),9,19,Print=F)
N=100 # 来院患者数
n.win=1 # サービス窓口数
mu=8 # サービス率(1時間診察人数)
client=hist(data,freq=F,breaks=30,col='skyblue',main='',xlab='clock time')
breaks=client$breaks
y=client$counts/sum(client$counts)*N # 総数をN人に
# 到達率関数,離散量を連続関数に
R <- function(x) ifelse((9<x&x<12.5)|(15.5<x&x<19),y[which.max(x<=breaks)-1],0)
R=Vectorize(R)
curve(R(x),9,20,type='h',bty='l')
c=n.win*mu # 総サービス率
abline(h=c,col=8)
t1=uniroot(function(t)R(t)-c,c(9,10))$root ; t1 # 到達率=サービス率で待ち時間開始
t2=uniroot(function(t)R(t)-c,c(16,17))$root ; t2 # 午後の部

422:卵の名無しさん
18/11/30 23:12:57.93 c4eruZjZ.net
tt=seq(9,24,len=1000)
Rtt=R(tt)
plot(tt,Rtt,type='s',bty='l')
cumR=cumsum(Rtt)/sum(Rtt)*N # cumsumで累積来院数をgrid化
plot(tt,cumR,type='l',bty='l')
A <- function(t) cumR[which.max(t<=tt)] # 離散量を連続関数に
A=Vectorize(A)
curve(A(x),9,24,bty='l')
Q <- function(t){ # 時刻tでの待ち人数
if(t<t1) return(0)
if(t1<t&t<t2) return(max(A(t)-A(t1)-c*(t-t1),0)) # 午前の部
else return(max(A(t)-A(t2)-c*(t-t2),0)) # 午後の部
}
Q=Vectorize(Q)
curve(Q(x),9,24,bty='l',type='h',col=2,ylab='persons',xlab='clock time')
# 待ちの発生と終了の時刻をグラフから読み取る
t15=seq(14,15,len=100) ; plot(t15,sapply(t15,Q)) # 14.6
t17=seq(16.9,17.2,len=100) ; plot(t17,sapply(t17,Q)) # 17.0
Q(22.7)
t22=seq(22.75,22.80,len=100) ; plot(t22,sapply(t22,Q)) # 22.8
curve(Q(x),9,24,bty='l',type='h',col=2,ylab='persons',xlab='clock time')
MASS::area(Q,9, 14.6,limit=20)/A(14.6) # 午前の待ち時間
MASS::area(Q,17,22.8,limit=20)/(A(22.8)-A(17)) # 午後の待ち時間

423:卵の名無しさん
18/11/30 23:51:07.01 c4eruZjZ.net
午前の受付9時から12時30分まで午後の受付15時30分から19時までのクリニックに
図のような二峰性の分布で100人が来院するとする。
URLリンク(i.imgur.com)
> breaks
[1] 9.0 9.5 10.0 10.5 11.0 11.5 12.0 12.5 13.0 13.5 14.0 14.5
[13] 15.0 15.5 16.0 16.5 17.0 17.5 18.0 18.5 19.0
> round(y)
[1] 5 8 10 8 6 5 3 0 0 0 0 0 0 0 0 7 19 17 8 3
医師は一人、診察時間は平均8分として待ち時間をグラフ化。
URLリンク(i.imgur.com)
数値積分して平均の待ち時間を算出。
> integrate(Q,9,14.6,subdivisions=256)$value/A(14.6) # 午前の待ち時間
[1] 1.175392
> integrate(Q,17,22.8,subdivisions=256)$value/(A(22.8)-A(17)) # 午後の待ち時間
[1] 2.214289

424:卵の名無しさん
18/12/01 00:40:16.84 yFxD3TpK.net
>>385
混雑と待ち(朝倉書店)が届いたので
これやってみた。
ポアソン分布や指数分布を前提とせず、実際のヒストグラムから待ち時間のシミュレーション。
午前の受付9時から12時30分まで午後の受付15時30分から19時までのクリニックに
図のような二峰性の分布で100人が来院するとする。
URLリンク(i.imgur.com)
> breaks
[1] 9.0 9.5 10.0 10.5 11.0 11.5 12.0 12.5 13.0 13.5 14.0 14.5
[13] 15.0 15.5 16.0 16.5 17.0 17.5 18.0 18.5 19.0
> round(y)
[1] 5 8 10 8 6 5 3 0 0 0 0 0 0 0 0 7 19 17 8 3
医師は一人、診察時間は平均8分として待ち時間をグラフ化。
URLリンク(i.imgur.com)
数値積分して平均の待ち時間を算出。
> integrate(Q,9,14.6,subdivisions=256)$value/A(14.6) # 午前の待ち時間
[1] 1.175392
> integrate(Q,17,22.8,subdivisions=256)$value/(A(22.8)-A(17)) # 午後の待ち時間
[1] 2.214289

URLリンク(i.imgur.com)
診療終了23時w

425:卵の名無しさん
18/12/01 00:40:42.20 yFxD3TpK.net
午後から医師は二人に増やすとどうなるかシミュレーションしてみた。
診察時間は一人平均8分の設定は同じ。
URLリンク(i.imgur.com)
> integrate(Q,17,19.9,subdivisions=256)$value/(A(19.9)-A(17)) # 午後の待ち時間
[1] 1.496882
待ち時間が2.2時間から1.5時間に短縮。
診療終了は20時!

426:卵の名無しさん
18/12/01 09:45:22.56 j/i2xXms.net
Prudence, indeed, will dictate that "uraguchi" long established cannot be changed for light and transient causes;
and accordingly all experience has shown, that BMS are more disposed to suffer, while evils are sufferable, than to right themselves by abolishing the forms from which they can pursue profit.
But when a long train of misbehavior and misconduct , showing invariably the same Imbecility evinces a design to reveal themselves as absolute Bona Fide Moron ,
it is their right, it is their duty, to expel such "uraguchi", and to provide new guards for their future security.

427:卵の名無しさん
18/12/01 10:03:30.90 RmWyTNtb.net
rm(list=ls())
nwin=2 ; mu=10
C=nwin*mu # サービス効率
R <- function(t) dgamma(t,2,1)*100 # 到達関数
R=Vectorize(R)
curve(R(x),0,10,bty='l') ; abline(h=C,col=8)
t1=uniroot(function(x)R(x)-C,c(0,1))$root ; t1 # 行列開始時刻
t2=optimise(R,c(0,2),maximum = T)$maximum ; t2 # 行列増大速度最高時刻
t3=uniroot(function(x)R(x)-C,c(1,4))$root ; t3 # 行列最長時刻
A <- function(t) integrate(R,0,t)$value # 累積来客数
A=Vectorize(A)
curve(A(x),0,10,bty='l')
Q <- function(t) A(t)-A(t1)-C*(t-t1) # 行列人数
Q=Vectorize(Q)
curve(Q(x),0,10,bty='l') ; abline(h=0,col=8)
optimize(Q,c(0,10),maximum=T)$maximum ; t3 # 行列最長時刻
t4=uniroot(Q,c(4,8))$root ; t4 # 行列終了時刻
# calculate t4 w/o Q-function 到達関数から行列終了時刻を算出
curve(R(x),0,10,bty='l',xlab='clock time',ylab='arrival rate')
abline(h=C,col=8)
t13=seq(t1,t3,len=20)
segments(x0=t13,y0=C,y1=R(t13),col=3)
text(1.25,25,'V') ; text(c(t1,t3,t4),20,c('t1','t3','t4'),cex=0.95)
V=integrate(function(t)R(t)-C,t1,t3)$value ; V # 待ち時間*人数
dQ <- function(t) integrate(function(x) C-R(x),t3,t)$value - V
uniroot(dQ,c(t3,10))$root ; t4
t34=seq(t3,t4,len=20)
segments(x0=t34,y0=20,y1=R(t34),col='cyan') ; text(4,15,'V')

428:卵の名無しさん
18/12/01 10:07:43.30 RmWyTNtb.net
>>400
到着関数が一峰性だと待ち行列が0になる時間が割と簡単に算出できる。
ド底辺シリツ医大裏口入学には無理だけどw
URLリンク(i.imgur.com)

429:卵の名無しさん
18/12/01 10:24:54.70 RmWyTNtb.net
>>399
ド底辺シリツ医を蔑むパロディであることわかってコピペしてんの?
これにでも答えてみ!
あるド底辺裏口シリツ医大のある学年に100人の学生がいる。
100人の学生は全員裏口入学である。
裏口入学を自覚したら翌日に退学しなければならない。
学生は自分以外の学生が裏口入学であるとことは全員知っているが自分が裏口入学であることは知らない。
教授が全員の前で「この学年には少なくとも一人が裏口入学している」と発言した。
この後、どうなるかを述べよ。

430:卵の名無しさん
18/12/01 13:36:46.51 ZZpMV2Nw.net
この季節はいつも風邪気味になるなぁ
外来から貰ってんのかな
冬コミが近いのに原稿がまだできとらんが
体調管理はしっかりしていかんとなぁ
ジャンルはFTで良いかなぁ
ガチ百合にすっかなぁ

431:卵の名無しさん
18/12/01 16:09:30.06 ZZpMV2Nw.net
便秘


432:薬をいろいろ試しているが どれが良いかなぁ



433:卵の名無しさん
18/12/01 18:54:24.93 RmWyTNtb.net
t0fn <- function(n){ # terminal 0 of factorial n ( n=10, 10!=3628800 => 2
m=floor(log(n)/log(5))
ans=0
for(i in 1:m) ans=ans+n%/%(5^i)
ans
}
t0fn=Vectorize(t0fn)
t0fn(10^(1:12))
10!から1兆!まで末尾の0の数
> t0fn(10^(1:12))
[1] 2 24 249 2499 24999
[6] 249998 2499999 24999999 249999998 2499999997
[11] 24999999997 249999999997

434:卵の名無しさん
18/12/01 18:55:28.45 RmWyTNtb.net
おい、ド底辺。
1兆の階乗は末尾に0が
249999999997
並ぶと計算されたが、あってるか?
検算しておいてくれ。

435:卵の名無しさん
18/12/01 20:53:46.49 o9d/f5rc.net
今年の納税額は五千万超えるなぁ
冬コミはFTCW の新作出るかなぁ?

436:卵の名無しさん
18/12/01 21:08:44.05 o9d/f5rc.net
ふ◯◯◯ち◯◯れ◯◯◯◯

437:卵の名無しさん
18/12/01 22:41:26.00 N4WBnKxq.net
It is common knowledge among doctors and patients that Do-Teihen(exclusively bottom-leveled medical school) graduates mean morons who bought their way to Gachi'Ura(currently called by themselves)
According to the experience of entrance exam to medical school in the era of Showa, when the sense of discrimination against
privately-founded medical schools were more intense than it is now,
all such schools but for Keio had been so compared to some specialized institution for educable mentally retarded kids that nobody but imbecile successors of physicians in private practice had applied for admission.
There had been NOT a single classmate who chose willingly against his/her common sense to go to the Do-Teihen(exclusively bottom-leveled medical school, currently also known as Gachi'Ura),
which would have cost outrageous money and its graduates are destined to be called Uraguchi morons who bought thier way into the Do-Teihen, by thier colleagues and even by thier own clients.
Although people won't call them names to their face,
certain 80-90% people of about my age have been yet scorning and sneering at Uraguchi graduates, speaking in the back of our mind,
" Uraguchi morons shall not behave like somebody."
We never speak out face to face in real life.

438:卵の名無しさん
18/12/01 23:38:07.20 yFxD3TpK.net
あるド底辺裏口シリツ医大のある学年に100人の学生がいる。
100人の学生は全員裏口入学である。
裏口入学を自覚したら翌日に退学しなければならない。
学生は自分以外の学生が裏口入学であるとことは全員知っているが自分が裏口入学であることは知らない。
教授が全員の前で「この学年には少なくとも一人が裏口入学している」と発言した。
この後、どうなるかを述べよ。

439:卵の名無しさん
18/12/02 06:45:16.31 e9Pc8hcV.net
# Troubled train T1 with m passengers left station S1 arrived S2 station s minute later
# than depature of train T0
# beta*m passenger got out and rs passengers got in, where
# r denotes in-passenger rate per minute, T0 took b(beta*m + rs) extra-minutes
# regular train T0 takes c minutes for exchange of passengers
dango <- function(s,m,beta=3/10,r=3,b=0.01,c=0){
mm=(1-beta)*m+r*s
ss=s+b*(beta*m+r*s)-c
c(ss,mm)
}
sm=c(10,100)
re=sm
for(i in 1:2){
sm=dango(sm[1],sm[2])
re=rbind(re,sm)
}
rownames(re)=NULL
plot(re)

440:卵の名無しさん
18/12/02 07:38:46.89 IdisUW1u.net
薬局の店舗数を増やそうかなぁ

441:卵の名無しさん
18/12/02 12:10:26.58 TL1hN1iv.net
dat=hist(c(rnorm(1e6),rnorm(1e5,5,0.5)))
attach(dat)
plot(breaks[-1],counts,type='s',log='y',ylim=range(counts))
segments(x0=breaks[-1],y=min(counts),y1=counts)
segments(x0=breaks[1],y=min(counts),y1=counts[1])

442:卵の名無しさん
18/12/02 21:14:03.05 qDXWsGoQ.net
liars <- function(Answer){ # case of all liars permitted
N=length(Answer)
dat=permutations(2,N,0:1,set=F,rep=T)
check <- function(y,answer=Answer){
all(answer[y==0]==sum(y)) # all honest answer compatible?  
} # numeric(0)==sum(y):logical(0) all(logical(0)) : TRUE
dat[apply(dat,1,check),]
}
liars(c(1,2,2,3,3))
liars(c(1,3,5,7,9,1,3,5,7,9))
(x=sample(10,10,rep=T)) ; apply(!liars(x),1,sum)
liars(c(8, 9, 8, 2, 4, 4, 2, 3, 9, 8))

443:卵の名無しさん
18/12/02 21:35:54.10 jYRj3cxk.net
Prudence, indeed, will dictate that "uraguchi" long established cannot be changed for light and transient causes;
and accordingly all experience has shown, that BMS are more disposed to suffer, while evils are sufferable, than to right themselves by abolishing the forms from which they can pursue profit.
But when a long train of misbehavior and misconduct , showing invariably the same Imbecility evinces a design to reveal themselves as absolute Bona Fide Moron ,
it is their right, it is their duty, to expel such "uraguchi", and to provide new guards for their future security.

444:卵の名無しさん
18/12/02 22:20:54.56 iMFc27fK.net
互いに相関のある5項目くらいのスコアの合計点から疾患の発生を予測するカットオフ値を求めました
単純に合計点した時の予測能は不十分であったため
主成分分析をして各主成分を線型結合して主成分スコアを出す時に、AUC値が最大になるように線型結合する係数に重み付けするのは一般的に大丈夫かしら?

445:卵の名無しさん
18/12/02 22:35:39.65 qDXWsGoQ.net
# 一般化、全員嘘つきも可、重複する答も可l
iars <- function(Answer){ # duplicate answer and/or case of all liars permitted
N=length(Answer)
dat=gtools::permutations(2,N,0:1,set=F,rep=T)
check <- function(y,answer=Answer){
if(all(y==1)) !all(1:N %in% answer)
else all(answer[y==0]==sum(y)) & !(sum(y) %in% answer[y==1])
# all honest answer compatible & not included in liar's anwer   
}
dat[apply(dat,1,check),]
}
liars(c(2,2,2,3,3))
liars(c(2,3,3,4,5))
liars(Answer<-sample(10,10,rep=T)) ; Answer
liars(c(4,5,5,6,7,7,8,8,9,10))

446:卵の名無しさん
18/12/02 22:54:14.37 5KkHnCxW.net
3S Policy Causes the ResultTruman of Panama document and 3S policy
We are keeping the citizens in a cage named "Freedom of Falsehood".
The way you just give them some luxury and convenience.Then release sports, screen, sex (3S).
Because the citizens are our livestock. For that reason, we must make it longevity. It makes it sick
(with chemicals etc.) and keeps it alive.This will keep us harvesting. This is also the authority
of the victorious country.The medal and the Nobel prize is not all Raoul declarationExamples of 3S policy
Hypocrites and disguised society and Panama document "He moved here here two years ago, I was afraid
of looking, but I thought it was a polite person to greet" Hello "when I saw it ... It was not like I was waking
this kind of incident ... ... "(Neighboring residents)On November 7, Shosuke Hotta, 42, a self-proclaimed office
worker in Sagamihara City, Kanagawa Prefecture, was arrested on suspicion of abusing her daughter Sakurai Ai.
This is the nature of the Earthlings

447:卵の名無しさん
18/12/02 23:16:13.68 +r9Osf+E.net
>>416
>互いに相関のある
なら変数減らせるんじゃね?
AUC?Area Under the Curve?
AICじゃなくて?

448:卵の名無しさん
18/12/02 23:31:52.94 61sstTZi.net
>>419
主成分3までで累積寄与度85%なので、3まで次元は減ります
主成分1 + 主成分2 + 主成分3とするのではなく
AUCを最大にする主成分1 + β1*主成分2 + β2*主成分3の
係数を出すっていうのは一般的に大丈夫なんでしょうか
AUCはarea under curveです

449:卵の名無しさん
18/12/02 23:42:05.45 +r9Osf+E.net
>>420
統計テキストの演習問題によくあるから一般的だろね。
三角形の周囲長のデータから線形回帰で面積を出すというような意味のないことやってるかも。

450:卵の名無しさん
18/12/02 23:50:18.66 5KkHnCxW.net
Prudence, indeed, will dictate that "uraguchi" long established cannot be changed for light and transient causes;
and accordingly all experience has shown, that BMS are more disposed to suffer, while evils are sufferable, than to right themselves by abolishing the forms from which they can pursue profit.
But when a long train of misbehavior and misconduct , showing invariably the same Imbecility evinces a design to reveal themselves as absolute Bona Fide Moron ,
it is their right, it is their duty, to expel such "uraguchi", and to provide new guards for their future security.

451:卵の名無しさん
18/12/02 23:57:57.44 iMFc27fK.net
>>421
次数が減るのがメリットかなと…

452:卵の名無しさん
18/12/03 07:19:35.51 DAMQxIpv.net
>>423
長方形の周囲長者から面積をだすのに
データが100個あればラグランジェの補完式で100次元式で完璧に当てはめることができる。
フィボナッチ数列も同じ。

453:卵の名無しさん
18/12/03 07:22:30.11 DAMQxIpv.net
象の体表面積の計算に有用な数値ってどこだろ?
身長体重鼻の長さ耳の大きさ?

454:卵の名無しさん
18/12/03 07:24:12.72 DAMQxIpv.net
スリーサ�


455:Cズと身長体重の相関とか某女子大の講師が書いてたなw



456:卵の名無しさん
18/12/03 08:49:08.21 cRcCrmb8.net
par(mfrow=c(2,1))
f <- function(x,a=0.01) a^x - log(x)/log(a)
curve(f(x),0,2,bty='l') ; abline(h=1,col=8)
D( expression(a^x - log(x)/log(a)),'x')
df <- function(x,a=0.01) a^x * log(a) - 1/x/log(a)
curve(df(x))
g <- function(x,a=0.01) a^x/(log(x)/log(a))
curve(g(x),0,2,bty='l') ; abline(h=1,col=8)
D(expression (a^x/(log(x)/log(a))),'x')
dg <- function(x,a=0.01) a^x * log(a)/(log(x)/log(a)) - a^x * (1/x/log(a))/(log(x)/log(a))^2
curve(dg,0,10)

457:卵の名無しさん
18/12/03 11:40:13.52 DAMQxIpv.net
>>420
AICとかWAICで比較する方法があったはず。

458:卵の名無しさん
18/12/03 12:54:57.80 DAMQxIpv.net
rm(list=ls())
library(gtools)
N=11
Answer=1:N
dat=permutations(2,N,0:1,set=F,rep=T) ; colnames(dat)=LETTERS[1:N]
# 1:嘘つき 0:正直 例.1 1 1 0 1 1 1 1 1 0 1で矛盾がないか調べる
check <- function(y,answer=Answer){ # remark 各人の解答
if(all(y==1)) !all(1:N %in% answer) # 正直者がいないとき
else all(answer[y==0]==sum(y)) & !(sum(y) %in% answer[y==1])
# すべての正直者の答のみが現実と一致するか?  
}
dat[apply(dat,1,check),]
# 一般化、全員嘘つきも可、重複する答も可
liars <- function(Answer,Strict=TRUE){ # duplicate answer and/or case of all liars permitted, Strict:liars always lie
N=length(Answer)
dat=gtools::permutations(2,N,0:1,set=F,rep=T)
check <- function(y,answer=Answer){
if(all(y==1)) !all(1:N %in% answer)
else if(Strict) all(answer[y==0]==sum(y)) & !(sum(y) %in% answer[y==1])
else all(answer[y==0]==sum(y))
# all honest answer compatible & not included in liar's anwer
}
dat[apply(dat,1,check),]
}
liars(c(2,2,2,3,3))
liars(c(2,3,3,4,5))
liars(Answer<-sample(10,10,rep=T)) ; Answer
liars(c(4,5,5,6,7,7,8,8,9,10))
liars(c(4,5,5,6,7,7,8,8,9,10),S=F)

459:卵の名無しさん
18/12/03 13:13:54.59 DAMQxIpv.net
シリツ医の使命は裏口入学撲滅国民運動の先頭に立つことだよ。
裏口入学の学生を除籍処分にしないかぎり、信頼の回復はないね。つまり、いつまで経ってもシリツ医大卒=裏口バカと汚名は拭えない。シリツ出身者こそ、裏口入学に厳しい処分せよを訴えるべき。
裏口入学医師の免許剥奪を!の国民運動の先頭に立てばよいぞ。
僕も裏口入学とか、言ってたら信頼の回復はない。

460:卵の名無しさん
18/12/03 15:36:25.67 1KqGOOJS.net
rm(list=ls())
graphics.off()
.a=0.01
f = function(x,a=.a) a^x-log(x)/log(a)
curve(f(x),bty='l',lwd=2) ; abline(h=0,col=8)
max=optimize(f,c(0,1),maximum=T)$maximum
min=optimize(f,c(0,1),maximum=F)$minimum
x1=uniroot(f,c(0,max))$root
x2=uniroot(f,c(max,min))$root
x3=uniroot(f,c(min,1))$root
ans=c(x1,x2,x3) ; ans
points(ans,c(0,0,0),pch=19,col=2)

461:卵の名無しさん
18/12/03 21:38:41.65 uthawMyt.net
liars <- function(Answer,Strict=TRUE){ # duplicate answer and/or case of all liars permitted
N=length(Answer)
dat=gtools::permutations(2,N,0:1,set=F,rep=T)
check <- function(y,answer=Answer){
if(all(y==1)) {!all(1:N %in% answer)}
else{
if(Strict){all(answer[y==0]==sum(y)) & !(sum(y) %in% answer[y==1])}
else {all(answer[y==0]==sum(y))}
}
# all honest answer compatible & not included in liar's anwer
}
dat[apply(dat,1,check),]
}
liars(c(2,2,2,3,3))
liars(c(2,3,3,4,5),S=F)
liars(Answer<-sample(10,10,rep=T),S=F) ; Answer
liars(Answer)
sort(Answer)
liars(c(1, 2, 3, 4, 5, 5, 5, 5, 9, 9, 9),Strict=FALSE)
liars(c(1, 2, 3, 4, 5, 5, 5, 5, 9, 9, 9),Strict=TRUE)

462:卵の名無しさん
18/12/03 21:39:50.88 uthawMyt.net
> liars(c(1, 2, 3, 4, 5, 5, 5, 5, 9, 9, 9),Strict=FALSE)
[,1] [,2] [,3] [,4] [,5] [,6] [,7] [,8] [,9] [,10] [,11]
[1,] 1 1 1 1 1 1 1 1 0 0 1
[2,] 1 1 1 1 1 1 1 1 0 1 0
[3,] 1 1 1 1 1 1 1 1 1 0 0
[4,] 1 1 1 1 1 1 1 1 1 1 1
> liars(c(1, 2, 3, 4, 5, 5, 5, 5, 9, 9, 9),Strict=TRUE)
[1] 1 1 1 1 1 1 1 1 1 1 1

463:卵の名無しさん
18/12/03 22:45:35.45 uthawMyt.net
liars <- function(Answer,Strict=TRUE){ # duplicate answer and/or case of all liars permitted
N=length(Answer)
arg=list()
for(i in 1:N) arg[[i]]=0:1
dat=do.call(expand.grid,arg) # expand.grid(0:1,0:1,0:1,...,0:1)
colnames(dat)=LETTERS[1:N]
check <- function(y,answer=Answer){
if(all(y==1)) {!all(1:N %in% answer)}
else{ # Strict: all honest answer compatible & not included in liar's anwer
if(Strict){all(answer[y==0]==sum(y)) & !(sum(y) %in% answer[y==1])}
else {all(answer[y==0]==sum(y))}
}
}
dat[apply(dat,1,check),]
}
liars(Answer<-sample(10,10,rep=T),S=F) ; Answer
liars(c(1, 2, 3, 4, 5, 5, 5, 5, 9, 9, 9),Strict=FALSE)
liars(c(1, 2, 3, 4, 5, 5, 5, 5, 9, 9, 9),Strict=TRUE)

464:卵の名無しさん
18/12/03 23:36:09.50 kWZ8ngVO.net
しゅごーいAWP

465:卵の名無しさん
18/12/03 23:36:55.91 uthawMyt.net
liars <- function(Answer,Strict=TRUE){ # duplicate answer and/or case of all liars permitted
N=length(Answer)
arg=list()
for(i in 1:N) arg[[i]]=0:1
dat=do.call(expand.grid,arg) # expand.grid(0:1,0:1,0:1,...,0:1)
colnames(dat)=LETTERS[1:N]
check <- function(y,answer=Answer){
if(all(y==1)) {!all(1:N %in% answer)}
else{ # Strict: all honest answer compatible & not included in liar's anwer
if(Strict){all(answer[y==0]==sum(y)) & !(sum(y) %in% answer[y==1])}
else {all(answer[y==0]==sum(y))}
}
}
res=as.matrix(dat[apply(dat,1,check),])
rownames(res)=NULL
return(res)
}
liars(Answer<-sample(10,10,rep=T),S=F) ; Answer
liars(c(1, 2, 3, 4, 5, 5, 5, 5, 9, 9, 9),Strict=FALSE)
liars(c(1, 2, 3, 4, 5, 5, 5, 5, 9, 9, 9),Strict=TRUE)

466:卵の名無しさん
18/12/04 01:12:57.83 nI+jKERK.net
It is common knowledge among doctors and patients that Do-Teihen(exclusively bottom-leveled medical school) graduates mean morons who bought their way to Gachi'Ura(currently called by themselves)
According to the experience of entrance exam to medical school in the era of Showa, when the sense of discrimination against
privately-founded medical schools were more intense than it is now,
all such schools but for Keio had been so compared to some specialized institution for educable mentally retarded kids that nobody but imbecile successors of physicians in private practice had applied for admission.
There had been NOT a single classmate who chose willingly against his/her common sense to go to the Do-Teihen(exclusively bottom-leveled medical school, currently also known as Gachi'Ura),
which would have cost outrageous money and its graduates are destined to be called Uraguchi morons who bought thier way into the Do-Teihen, by thier colleagues and even by thier own clients.
Although people won't call them names to their face,
certain 80-90% people of about my age have been yet scorning and sneering at Uraguchi graduates, speaking in the back of our mind,
" Uraguchi morons shall not behave like somebody."
We never speak out face to face in real life.

467:卵の名無しさん
18/12/04 15:14:54.20 nfS0Ph7I.net
>>436
個数を表示するように改造
# 一般化、全員嘘つきも可、重複する答も可
liars <- function(Answer,Strict=FALSE){ # duplicate answer and/or case of all liars permitted
N=length(Answer) # Strict: liars always lie, never tell the truth
arg=list()
for(i in 1:N) arg[[i]]=0:1
dat=do.call(expand.grid,arg) # expand.grid(0:1,0:1,0:1,...,0:1)
colnames(dat)=LETTERS[1:N]
check <- function(y,answer=Answer){
if(all(y==1)) {!all(1:N %in% answer)}
else{ # Strict: all honest answer compatible & not included in liar's anwer
if(Strict){all(answer[y==0]==sum(y)) & !(sum(y) %in% answer[y==1])}
else {all(answer[y==0]==sum(y))}
}
}
re=as.matrix(dat[apply(dat,1,check),])
rownames(re)=1:nrow(re)
return(rbind(re,Answer))
}

liars(Answer<-sample(10,10,rep=T),S=F)
liars(c(1,2,3,4,5,5,5,5,9,9,9),Strict=FALSE)
liars(c(1,2,3,4,5,5,5,5,9,9,9),Strict=TRUE)
liars(c(7,7,7,7,8,8,8,9,9,10,11),Strict=F)

468:卵の名無しさん
18/12/04 19:24:56.87 nfS0Ph7I.net
バスの到着間隔が平均30分の指数分布であるEバスと
平均30分の一様分布であるUバス�


469:ナはどちらが待ち時間の期待値が小さいか?



470:卵の名無しさん
18/12/05 00:36:57.95 DRmF49xK.net
It is common knowledge among doctors and patients that Do-Teihen(exclusively bottom-leveled medical school) graduates mean morons who bought their way to Gachi'Ura(currently called by themselves)
According to the experience of entrance exam to medical school in the era of Showa, when the sense of discrimination against
privately-founded medical schools were more intense than it is now,
all such schools but for Keio had been so compared to some specialized institution for educable mentally retarded kids that nobody but imbecile successors of physicians in private practice had applied for admission.
There had been NOT a single classmate who chose willingly against his/her common sense to go to the Do-Teihen(exclusively bottom-leveled medical school, currently also known as Gachi'Ura),
which would have cost outrageous money and its graduates are destined to be called Uraguchi morons who bought thier way into the Do-Teihen, by thier colleagues and even by thier own clients.
Although people won't call them names to their face,
certain 80-90% people of about my age have been yet scorning and sneering at Uraguchi graduates, speaking in the back of our mind,
" Uraguchi morons shall not behave like somebody."
We never speak out face to face in real life.

471:卵の名無しさん
18/12/05 18:34:25.14 mPAQrzgG.net
-- zerOne 5 -> [[0,0,0,0,0],[0,0,0,0,1]....[1,1,1,1,1,1]
zeroOne :: Num a => Int -> [[a]]
zeroOne n = (!! n) $ iterate (\x-> [a:b|a<-[0,1],b<-x]) [[]]

472:卵の名無しさん
18/12/05 19:07:50.43 XTI9A75j.net
It is common knowledge among doctors and patients that Do-Teihen(exclusively bottom-leveled medical school) graduates mean morons who bought their way to Gachi'Ura(currently called by themselves)
According to the experience of entrance exam to medical school in the era of Showa, when the sense of discrimination against
privately-founded medical schools were more intense than it is now,
all such schools but for Keio had been so compared to some specialized institution for educable mentally retarded kids that nobody but imbecile successors of physicians in private practice had applied for admission.
There had been NOT a single classmate who chose willingly against his/her common sense to go to the Do-Teihen(exclusively bottom-leveled medical school, currently also known as Gachi'Ura),
which would have cost outrageous money and its graduates are destined to be called Uraguchi morons who bought thier way into the Do-Teihen, by thier colleagues and even by thier own clients.
Although people won't call them names to their face,
certain 80-90% people of about my age have been yet scorning and sneering at Uraguchi graduates, speaking in the back of our mind,
" Uraguchi morons shall not behave like somebody."
We never speak out face to face in real life.

473:卵の名無しさん
18/12/05 22:12:31.75 kHtcpiLC.net
# dat : all possible combinations
n=5 ;arg=list()
for(i in 1:n) arg[[i]]=0:1
dat=do.call(expand.grid,arg) # expand.grid(0:1,0:1,...)
dat=as.matrix(dat)
colnames(dat)=LETTERS[1:n]
# A=>!B, B=>C, C=>!D&!E, D=>!E, E=>E
is.compati<-function(i,x){ # i:index of honest, x: possible combination
switch(i, # 1..n
x['B']==0, # testified by A (=LETTERS[1])
x['C']==1, # testified by B (=LETTERS[2])
x['D']==0 & x['E']==0, # ...
x['E']==0,
x['E']==1)
}
check=function(x){
re=NULL
honest=which(x==1) # index of honest
for(i in honest){
re=append(re,is.compati(i,x))
}
all(re)
}
dat[apply(dat,1,check),]

474:卵の名無しさん
18/12/05 22:13:09.98 kHtcpiLC.net
正直者は嘘をつかないが
嘘つきは嘘をつくこともつかないこともある。
A~Eの5人が次のように発言している
A「Bはウソつきだ」
B「Cはウソつきではない」
C「D.Eはどちらもウソつきだ」
D「Eはウソつきだ」
E「私はウソつきではない」
5人のうち、正直者と嘘つきは誰か?
可能性のある組合せをすべて示せ。

475:卵の名無しさん
18/12/06 09:56:22.91 cp3ws/tO.net
>>444
嘘つきが必ず嘘をつくStrict=TRUE、嘘も真実もいうStrict=FALSE
でどちらにも対応。
# dat : all possible combinations
n=5 ;arg=list()
for(i in 1:n) arg[[i]]=0:1
dat=do.call(expand.grid,arg) # expand.grid(0:1,0:1,...)
dat=as.matrix(dat)
colnames(dat)=LETTERS[1:n]
# A=>!B, B=>C, C=>!D&!E, D=>!E, E=>E
is.compati.H<-function(i,x){ # i:index of honest, x: possible combination
switch(i, # 1..n
x['B']==0, # testified by A (=LETTERS[1])
x['C']==1, # testified by B (=LETTERS[2])
x['D']==0 & x['E']==0, # ...
x['E']==0,
x['E']==1)
}
is.compati.L <- function(i,x){# is compatible for liars?
# i:index of liars, x: possible combination
switch(i, # 1..n
!(x['B']==0), # testified by A (=LETTERS[1])
!(x['C']==1), # testified by B (=LETTERS[2])
!(x['D']==0 & x['E']==0), # ...
!(x['E']==0),
!(x['E']==1))
}

476:卵の名無しさん
18/12/06 09:56:52.33 cp3ws/tO.net
check=function(x,Strict){
re=NULL
honest=which(x==1) # index of honest
for(i in honest){
re=append(re,is.compati.H(i,x))
}
if(Strict){
liar=which(x==0) # index of liar
for(i in liar){
re=append(re,is.compati.L(i,x))
}
}
all(re)
}
dat[apply(dat,1,function(x) check(x,Strict=TRUE)),]
dat[apply(dat,1,function(x) check(x,Strict=FALSE)),]

477:卵の名無しさん
18/12/06 16:42:18.52 E+1fMA/x.net
dat=as.matrix(expand.grid(1:0,1:0,1:0))
colnames(dat)=LETTERS[1:3]
compati.H <- function(i,x){ # i index of honest, x: possible combination
switch(i, # i= 1,2,or,3
# if A is honest, B should be honest, compatible?
ans <- x[2]==1, # when i=1
# if B is honest,C is a liar thereby A should be honest. compatible?
ans <- x[3]==0 & ifelse(x[3]==0,!(x[1]==0),x[1]==0), # when i=2, x[3]==0 & x[1]==1
ans <- NULL) # when i=3
return(ans)
}
compati.L <- function(i,x){ # i index of liar, x: possible combination
switch(i,
ans <- x[2]==0,
ans <- x[3]==1 & x[1]==1,
ans <- NULL)
return(ans)}
check <- function(x,Strict){
re=NULL
honest <- which(x==1)
for(i in honest){
re=append(re,compati.H(i,x))}
if(Strict){
liar <- which(x==0)
for(i in liar){
re=append(re,compati.L(i,x)) }}
all(re)}
dat[apply(dat,1,function(x) check(x,Strict=TRUE)),]
dat[apply(dat,1,function(x) check(x,Strict=FALSE)),]

478:卵の名無しさん
18/12/06 20:20:59.86 E+1fMA/x.net
a=1
m=100
n=1e6
x=sample(c(a/m,m*a),n,rep=T,prob=c(m/(m+1),1/(m+1))) ; hist(x,freq=F) ; mean(x)
a/m*m/(m+1)+m*a*1/(m+1) ; a/(m+1)*(1+m)
plot(c(m/(m/1),1/(m+1)),c(a/m,m*a),bty='l')
EX2=(a/m)^2*m/(m+1)+(m*a)^2*(1/(m+1))
(EW = EX2/a/2) ; mean(x^2)/mean(x)/2
EW <- function(m,a=1) (m^3+1)/m/(m+1)/2*a
m=1:100
plot(m,EW(m),bty='l')

479:卵の名無しさん
18/12/07 03:14:44.29 YE3oTb4v.net
It is common knowledge among doctors and patients that Do-Teihen(exclusively bottom-leveled medical school) graduates mean morons who bought their way to Gachi'Ura(currently called by themselves)
According to the experience of entrance exam to medical school in the era of Showa, when the sense of discrimination against
privately-founded medical schools were more intense than it is now,
all such schools but for Keio had been so compared to some specialized institution for educable mentally retarded kids that nobody but imbecile successors of physicians in private practice had applied for admission.
There had been NOT a single classmate who chose willingly against his/her common sense to go to the Do-Teihen(exclusively bottom-leveled medical school, currently also known as Gachi'Ura),
which would have cost outrageous money and its graduates are destined to be called Uraguchi morons who bought thier way into the Do-Teihen, by thier colleagues and even by thier own clients.
Although people won't call them names to their face,
certain 80-90% people of about my age have been yet scorning and sneering at Uraguchi graduates, speaking in the back of our mind,
" Uraguchi morons shall not behave like somebody."
We never speak out face to face in real life.

480:卵の名無しさん
18/12/07 08:24:44.19 ySmU7MDt.net
>>449
裏口馬鹿にもわかるように原文もつけなきゃ。

原文はこれな。
私は昭和の時代に大学受験したけど、昔は今よりも差別感が凄く、慶応以外の私立医は特殊民のための特殊学校というイメージで開業医のバカ息子以外は誰も受験しようとすらしなかった。
常識的に考えて、数千万という法外な金を払って、しかも同業者からも患者からもバカだの裏口だのと散々罵られるのをわかって好き好んで私立医に行く同級生は一人もいませんでした。
本人には面と向かっては言わないけれど、俺くらいの年代の人間は、おそらくは8-9割は私立卒を今でも「何偉そうなこと抜かしてるんだ、この裏口バカが」と心の底で軽蔑し、嘲笑しているよ。当の本人には面と向かっては絶対にそんなことは言わないけどね。

481:卵の名無しさん
18/12/07 08:27:54.51 ySmU7MDt.net
開業医スレのシリツ三法則(試案、名投稿より作成)
1.私立医が予想通り糞だからしょうがない
>スレリンク(hosp板:101番)-102
>スレリンク(hosp板:844番)-853
ID:RFPm1BdQ
>スレリンク(hosp板:869番)
>スレリンク(hosp板:874番)-875
>スレリンク(hosp板:874番)-880
>スレリンク(hosp板:882番)
ID:liUvUPgn
2.馬鹿に馬鹿と言っちゃ嫌われるのは摂理
実例大杉!
3.リアルでは皆思ってるだけで口に出してないだけ
URLリンク(ishikisoku.com)

482:卵の名無しさん
18/12/07 20:21:20.38 g1XwAPhY.net
3S Policy Causes the ResultTruman of Panama document and 3S policy
We are keeping the citizens in a cage named "Freedom of Falsehood".
The way you just give them some luxury and convenience.Then release sports, screen, sex (3S).
Because the citizens are our livestock. For that reason, we must make it longevity. It makes it sick
(with chemicals etc.) and keeps it alive.This will keep us harvesting. This is also the authority
of the victorious country.The medal and the Nobel prize is not all Raoul declarationExamples of 3S policy
Hypocrites and disguised society and Panama document "He moved here here two years ago, I was afraid
of looking, but I thought it was a polite person to greet" Hello "when I saw it ... It was not like I was waking
this kind of incident ... ... "(Neighboring residents)On November 7, Shosuke Hotta, 42, a self-proclaimed office
worker in Sagamihara City, Kanagawa Prefecture, was arrested on suspicion of abusing her daughter Sakurai Ai.
This is the nature of the Earthlings

483:卵の名無しさん
18/12/08 07:31:43.87 xRW0g7nq.net
It is common knowledge among doctors and patients that Do-Teihen(exclusively bottom-leveled medical school) graduates mean morons who bought their way to Gachi'Ura(currently called by themselves)
According to the experience of entrance exam to medical school in the era of Showa, when the sense of discrimination against
privately-founded medical schools were more intense than it is now,
all such schools but for Keio had been so compared to some specialized institution for educable mentally retarded kids that nobody but imbecile successors of physicians in private practice had applied for admission.
There had been NOT a single classmate who chose willingly against his/her common sense to go to the Do-Teihen(exclusively bottom-leveled medical school, currently also known as Gachi'Ura),
which would have cost outrageous money and its graduates are destined to be called Uraguchi morons who bought thier way into the Do-Teihen, by thier colleagues and even by thier own clients.
Although people won't call them names to their face,
certain 80-90% people of about my age have been yet scorning and sneering at Uraguchi graduates, speaking in the back of our mind,
" Uraguchi morons shall not behave like somebody."
We never speak out face to face in real life.

484:卵の名無しさん
18/12/08 20:18:41.06 W3abFsTH.net
liars <- function(Answer,Strict=TRUE){ # duplicate answer and/or case of all liars permitted
N=length(Answer)
arg=list()
for(i in 1:N) arg[[i]]=0:1
dat=do.call(expand.grid,arg) # expand.grid(0:1,0:1,0:1,...,0:1)
colnames(dat)=LETTERS[1:N]
check <- function(y,answer=Answer){
if(all(y==1)) {!all(1:N %in% answer)}
else{ # Strict: all honest answer compatible & not included in liar's anwer
if(Strict){all(answer[y==0]==sum(y)) & !(sum(y) %in% answer[y==1])}
else {all(answer[y==0]==sum(y))}
}
}
dat[apply(dat,1,check),]
}
liars(Answer<-sample(10,10,rep=T),S=F) ; Answer
liars(c(1, 2, 3, 4, 5, 5, 5, 5, 9, 9, 9),Strict=FALSE)
liars(c(1, 2, 3, 4, 5, 5, 5, 5, 9, 9, 9),Strict=TRUE)

485:卵の名無しさん
18/12/09 09:45:50.49 EZ1Q6//t.net
URLリンク(www.tutorialspoint.com)
URLリンク(i.imgur.com)
URLリンク(i.imgur.com)

486:卵の名無しさん
18/12/10 04:15:43.72 u30TNISd.net
呪文:「ド底辺シリツ医大が悪いのではない、本人の頭が悪いんだ」を唱えると甲状腺機能が正常化するという統計処理の捏造をやってみる。
TSH : 0.34~4.0 TSH:μIU/mlを基準値として(これが平均±2×標準偏差で計算されているとして)呪文前と呪文後のデータを正規分布で各々50個つくる。
負になった場合は検出限界以下として0にする。
URLリンク(i.imgur.com)
同じ平均値と標準偏差で乱数発生させただけなので両群には有意差はない。
横軸に呪文前のTSHの値、縦軸にTSHの変化(呪文後-呪文前)をグラフしてみると
URLリンク(i.imgur.com)
つまり、呪文前のTSHが高いほど呪文後はTSHは下がり、呪文前のTSHが低いほど呪文後のTSHは上がるという傾向がみてとれる。
これを線形回帰して確かめてみる。
回帰直線のパラメータは以下の通り。
Coefficients:
Estimate Std. Error t value Pr(>|t|)
(Intercept) 2.3812 0.3323 7.165 4.10e-09 ***
before -1.0351 0.1411 -7.338 2.24e-09 ***
---
Signif. codes: 0 ‘***’ 0.001 ‘**’ 0.01 ‘*’ 0.0


487:5 ‘.’ 0.1 ‘ ’ 1 Residual standard error: 0.8365 on 48 degrees of freedom Multiple R-squared: 0.5287, Adjusted R-squared: 0.5189 F-statistic: 53.84 on 1 and 48 DF, p-value: 2.237e-09 p = 2.24e-09 なので有意差ありとしてよい。 ゆえに、「ド底辺シリツ医大が悪いのではない、本人の頭が悪いんだ」という呪文は甲状腺機能を正常化させる。 ここで問題、この統計処理のどこが誤っているか?



488:卵の名無しさん
18/12/10 14:52:10.55 SBKPI/ud.net
アタマわるわる~

489:卵の名無しさん
18/12/10 22:04:30.67 7+YyXAYs.net
>>457
頭が悪いのは誤りを指摘できないお前の頭な。

490:卵の名無しさん
18/12/11 08:23:18.37 EyBBmFk4.net
野獣先輩、オナシャス
アタマわるわるわ~るわる~
アタマわるわるわ~るわる~
あそれっ
アタマわるわるわ~るわる~
アタマわるわるわ~るわる~
あよいしょっ
アタマわるわるわ~るわる~
アタマわるわるわ~るわる~
あくしろよ
アタマわるわるわ~るわる~
アタマわるわるわ~るわる~
endless

491:卵の名無しさん
18/12/11 08:39:06.09 PFEjAytf.net
>>459
文章だけでド底辺シリツ医大卒の裏口馬鹿とわかる。
これに答えられない国立卒がいた。
駅弁らしいが。
平均0、分散1の正規分布の95%信頼区域は[-1.96,1.96]で区域長は約3.92である。
平均0、分散1の一様分布の95%信頼区域の区域長さはいくらか?

492:卵の名無しさん
18/12/11 13:32:28.73 c5MyHopu.net
It is common knowledge among doctors and patients that Do-Teihen(exclusively bottom-leveled medical school) graduates mean morons who bought their way to Gachi'Ura(currently called by themselves)
According to the experience of entrance exam to medical school in the era of Showa, when the sense of discrimination against
privately-founded medical schools were more intense than it is now,
all such schools but for Keio had been so compared to some specialized institution for educable mentally retarded kids that nobody but imbecile successors of physicians in private practice had applied for admission.
There had been NOT a single classmate who chose willingly against his/her common sense to go to the Do-Teihen(exclusively bottom-leveled medical school, currently also known as Gachi'Ura),
which would have cost outrageous money and its graduates are destined to be called Uraguchi morons who bought thier way into the Do-Teihen, by thier colleagues and even by thier own clients.
Although people won't call them names to their face,
certain 80-90% people of about my age have been yet scorning and sneering at Uraguchi graduates, speaking in the back of our mind,
" Uraguchi morons shall not behave like somebody."
We never speak out face to face in real life.

493:卵の名無しさん
18/12/12 22:30:23.75 x9HwYbel.net
おいこら
あっちでまた非医師仲間のコンプが湧いてるぞ
さっさと引き取れや

494:卵の名無しさん
18/12/14 12:51:17.00 eeDD4wBK.net
回答付きでレスできない椰子ってシリツ卒なんだろうな。

495:卵の名無しさん
18/12/14 23:45:34.35 /gtLrghw.net
お前は今までに吐いたゲロの回数を覚えているのか?

496:卵の名無しさん
18/12/15 06:52:37.95 PqeMZC8f.net
>>464
ゲロの回数の従う事前分布をどう想定する?

497:卵の名無しさん
18/12/15 06:57:22.51 PqeMZC8f.net
ある女医が一日に5回屁をこいたとする。
屁の回数はポアソン分布と仮定して
この女医の一日にこく屁の回数の95%信頼区間を述べよ、
という問題にできるぞ。
答えてみ!

498:卵の名無しさん
18/12/15 07:17:43.02 PqeMZC8f.net
事前分布を想定して現実のデータからその分布の最適分布を算出する。当然、区間推定にある。
relocation of probability dustrubution
これがベイズ統計の基本的な考え方だよ。
上記の女医の屁の回数も区間推定できる。

499:卵の名無しさん
18/12/15 07:47:09.33 PqeMZC8f.net
ゲロの回数だとゼロ過剰ポアソン分布の方がいいだろうな。

500:卵の名無しさん
18/12/15 07:57:08.94 PqeMZC8f.net
URLリンク(kusanagi.hatenablog.jp)

501:卵の名無しさん
18/12/15 08:21:49.91 dSAl+lHg.net
臨床問題です
サブとアドンとBLの関連を原稿用紙30枚以上で考察せよ

502:卵の名無しさん
18/12/15 08:23:29.62 PqeMZC8f.net
>>470
んで、女医の放屁数は出せた?

503:卵の名無しさん
18/12/15 08:25:40.34 PqeMZC8f.net
>>470
問題の意味がわからないから詳述してくれ。
女医の屁の方は問題設定が明確だぞ。

504:卵の名無しさん
18/12/15 08:48:13.42 PqeMZC8f.net
ゲロの回数の事前分布なら
Zero-Inflated Negative Binomial Distribution
の方がいいかな。
Rにパッケージがあったような。
ポアソンよりパラメータが多くなるな。

505:卵の名無しさん
18/12/15 08:53:38.00 PqeMZC8f.net
VGAMに含まれてた。
URLリンク(www.rdocumentation.org)

506:卵の名無しさん
18/12/15 09:36:45.73 ek4No3cm.net
今日はこれで遊ぶかな。
URLリンク(stats.idre.ucla.edu)

507:卵の名無しさん
18/12/15 13:48:34.67 dSAl+lHg.net
問題に回答できないとは
さては中卒ニートだな

508:卵の名無しさん
18/12/15 14:06:30.51 Eu3ncs/k.net
>>476
>>470
問題の意味がわからないから詳述してくれ。
女医の屁の方は問題設定が明確だぞ。

509:卵の名無しさん
18/12/15 15:08:53.35 5ZAJ5aCI.net
こんな感じでゼロ過剰ポアソン分布モデルがつくれるな。
1年間にゲロを吐かない確率0.9
ゲロを吐いた場合の1年間あたりの回数=平均2のポアソン分布
theta=0.9
lambda=2
N=1e5
# Zero inflated poisson distribution
zip=numeric(N)
for (i in seq_along(zip)){
if(rbinom(1,1,1-theta)==0){
zip[i]=0
}else{
zip[i]=rpois(1,lambda)
}
}
おい、ド底辺、上記の過剰ポアソン分布モデルで
1年間に吐くゲロの回数の平均値を出してみ!

510:卵の名無しさん
18/12/15 15:09:33.17 5ZAJ5aCI.net
女医の放屁の方はポアソン分布でよさそうだな。
95%信頼区間を計算できたか?

511:卵の名無しさん
18/12/15 15:18:08.34 efNsfNge.net
自分で出した算数クイズは解けても
考察を要する問題は中卒には難しいようだな
解きやすいように少し簡単な問題にしてやろう
さて臨床問題です
ガチユリとフタナリの相関性について原稿用紙30枚以上で考察せよ

512:卵の名無しさん
18/12/15 15:31:26.76 5ZAJ5aCI.net
>>480
統計用語じゃないから、解説してくれ。

513:卵の名無しさん
18/12/15 15:41:42.49 5ZAJ5aCI.net
問題文が理解できない問題には答えられない。
当たり前のこと。
数学すれでも群論の話がでると俺は蚊帳の外。
図形とか確率なら理解できるから、取り組むよ。
こういうのは問題の意味は明確。
統計スレに書いていてポアソン分布知らないならお話にならないが。
ある女医が一日に5回屁をこいたとする。
屁の回数はポアソン分布と仮定して
この女医の一日にこく屁の回数の95%信頼区間を述べよ。

514:卵の名無しさん
18/12/15 15:50:36.53 5ZAJ5aCI.net
インフルエンザ迅速検査キットの感度が80%、偽陽性率1%とする。
臨床的にはインフルエンザを疑うが迅速検査陰性、
不要な薬は使いたくない、と患者の要望。
検査が早期すぎるための偽陰性かと考えて翌日再検したが、こちらも陰性。
「私がインフルエンザである可能性はどれくらいありますか?
可能性が10%以上なら仕事を休んで抗ウイルス薬希望します。」
という、検査前の有病率がいくら以上であればこの患者に抗ウイルス薬を処方することになるか?

515:卵の名無しさん
18/12/15 15:58:10.95 5ZAJ5aCI.net
nLR=(1-0.80)/0.99 # FN/TN
po=0.1/(1-0.1)
o=po/nLR^2 # po=o*nLR^2
o/(1+o)

516:卵の名無しさん
18/12/15 16:30:26.03 5ZAJ5aCI.net
インフルエンザの流行期ならなら有熱で受診した患者がインフルエンザである確率分布はこんな感じ(青のヒストグラム)
URLリンク(i.imgur.com)
平均値80%となるβ分布Beta(8,2)を想定。
すると インフルエンザ迅速検査キットの感度が80%、偽陽性率1%のキットでの検査陰性が2回続いた患者がインフルエンザである確率は桃色のヒストグラムのような分布になる。
平均値約20%、インフルエンザである確率が10%以上である可能性は74%と説明できる。

517:卵の名無しさん
18/12/15 16:41:26.81 5ZAJ5aCI.net
nLR=(1-0.80)/0.99 # FN/TN
po=0.1/(1-0.1)
o=po/nLR^2 # po=o*nLR^2
o/(1+o)
curve(dbeta(x,8,2),bty='l',ann=F,type='h',col='maroon')
N=1e5
x=rbeta(N,8,2)
hist(x,breaks=30,col='lightblue',main='検査前有病確率',
f=F,xlab='',yaxt='n', ylab='')
o=x/(1-


518:x) po=o*nLR^2 pp=po/(1+po) # hist(pp,f=F,breaks=50,col='pink',main='検査後有病確率', yaxt='n', xlab='',ylab='') BEST::plotPost(pp,compVal = 0.10,breaks=60,xlab="2回陰性後有病確率", col='pink',showMode=F)



519:卵の名無しさん
18/12/15 16:43:14.07 5ZAJ5aCI.net
par(mfrow=c(2,1))
theta=0.9
lambda=2
N=1e5
# Zero inflated poisson distribution
zip=numeric(N)
for (i in seq_along(zip)){
if(rbinom(1,1,1-theta)==0){
zip[i]=0
}else{
zip[i]=rpois(1,lambda)
}
}
hist(zip)
HDInterval::hdi(zip)
mean(zip)
# Hurdle distribution
hurdle=numeric(N)
for (i in seq_along(hurdle)){
if(rbinom(1,1,1-theta)==0){ # if zero, then zero
hurdle[i]=0
}else{ # else zero truncated poisson distribution
tmp=0
while(tmp==0){
tmp=rpois(1,lambda)
}
hurdle[i]=tmp
}
}
hist(hurdle)
HDInterval::hdi(hurdle)

520:卵の名無しさん
18/12/15 17:13:08.28 dSAl+lHg.net
この程度の問題文が理解できないとは
さては中卒ニートだな

521:卵の名無しさん
18/12/15 17:48:16.98 Eu3ncs/k.net
>>488
自分の出した問題も説明できないとはド底辺シリツか?

522:卵の名無しさん
18/12/15 17:50:19.60 Eu3ncs/k.net
>>488
知らんことには回答できない。
答えてほしけりゃ問題を敷衍して書けよ。
統計ネタなら答えるぞ。

523:卵の名無しさん
18/12/15 19:14:33.63 lcyf4Gyo.net
問題が理解すらできないとは
さては中卒ニートだな

524:卵の名無しさん
18/12/15 19:25:13.63 Eu3ncs/k.net
>>491
>>488
自分の出した問題も説明できないとはド底辺シリツか?

525:卵の名無しさん
18/12/15 20:03:13.15 lcyf4Gyo.net
試験で解答できなきゃ零点だ

526:卵の名無しさん
18/12/15 20:24:09.71 Eu3ncs/k.net
>>493
不適切問題じゃね。
こういうのが即答できれば基礎学力の試験になる。
ある女医が一日に5回屁をこいたとする。
屁の回数はポアソン分布と仮定して
この女医の一日にこく屁の回数の95%信頼区間を述べよ、

527:卵の名無しさん
18/12/15 20:34:41.94 Eu3ncs/k.net
>>493
原稿用紙30枚以上の模範解答書いてみ!
はよ、はよ!

528:卵の名無しさん
18/12/15 21:14:31.96 3n76OB9+.net
捏造データでお遊んでろ。

529:卵の名無しさん
18/12/15 21:24:38.91 Eu3ncs/k.net
>>496
ベイズ統計における事前確認は捏造ではなく
無情報もしくは弱情報分布である。
日本人女性の平均身長を1~2mの分布とする
というのが弱情報分布。

530:卵の名無しさん
18/12/15 21:25:49.01 Eu3ncs/k.net
事前分布の分散は逆ガンマより半コーシーを使うのがGelman流ね。

531:卵の名無しさん
18/12/15 21:29:02.64 Eu3ncs/k.net
事前確率分布を設定することでこういう計算も可能となる。
オマエの知識レベルじゃ無理だろうけど。
インフルエンザの迅速キットは特異度は高いが感度は検査時期によって左右される。
ある診断キットが開発されたとする。
このキットは特異度は99%と良好であったが、
感度については確かな情報がない。
事前確率分布として一様分布を仮定する。
50人を無作為抽出してこの診断キットで診断したところ40人が陽性であった。
この母集団の有病率の期待値と95%CIはいくらか?
またこの診断キットの感度の期待値と95%CIはいくらか

532:卵の名無しさん
18/12/16 01:08:39.24 /hMzfoFS.net
1年:進級失敗10人、うち1人放校
2年:進級失敗16人、放校なし
3年:進級失敗34人、うち放校9人
4年:進級失敗9人、うち放校2人
5年:進級失敗10人、うち放校1人
6年:卒業失敗26人、うち放校1人
スレリンク(doctor板:1番)
この放校者数をポアソン分布とゼロ過剰ポアソン分布で回帰してみる。
library(VGAM)
n=0:10
hoko=c(1,0,9,2,1,1)
fitp=glm(hoko ~ 1,poisson())
coef(fitp)
plot(nn,dpois(n,coef(fitp)),bty='l')
summary(fitp)
fitz=vglm(hoko ~ 1,zipoisson())
coef(fitz)
summary(fitz)
(pstr0=exp(coef(fitz)[1]))
(lambda=logit(coef(fit)[2],inv=T))
plot(n,dzipois(nn,lambda,pstr0),bty='l',pch=19)
URLリンク(i.imgur.com)

533:卵の名無しさん
18/12/16 0


534:6:39:53.73 ID:ZC5C+Eow.net



535:卵の名無しさん
18/12/16 07:47:33.23 /hMzfoFS.net
このページ便利だな。
回帰に必要なパッケージとその一覧がサンプル付きで一覧できる。
URLリンク(dwoll.de)

536:卵の名無しさん
18/12/16 07:49:21.32 /hMzfoFS.net
これも親切設計
wants <- c("lmtest", "MASS", "pscl", "sandwich", "VGAM")
has <- wants %in% rownames(installed.packages())
if(any(!has)) install.packages(wants[!has])

537:卵の名無しさん
18/12/16 10:16:17.73 1U2yFJp0.net
>>501
おい、上の過剰ゼロポアソンモデルから放校者数の期待値を計算してみ。
来年のド底辺シリツ医大の放校者の予想になるぞ。
まあ、ド底辺シリツが放校者ゼロ過剰というのは過大評価だがね。

538:卵の名無しさん
18/12/16 10:39:40.56 /hMzfoFS.net
pairsxyz <- function(x,y,z){
xyz=data.frame(x,y,z)
panel.cor <- function(x, y, ...){
usr <- par('usr'); on.exit(par(usr))
par(usr=c(0,1,0,1))
r <- cor(x, y, method='spearman', use='pairwise.complete.obs')
zcol <- lattice::level.colors(r, at=seq(-1, 1, length=81), col.regions=colorRampPalette(c(scales::muted('red'),'white',scales::muted('blue')), space='rgb')(81))
ell <- ellipse::ellipse(r, level=0.95, type='l', npoints=50, scale=c(.2, .2), centre=c(.5, .5))
polygon(ell, col=zcol, border=zcol, ...)
text(x=.5, y=.5, lab=100*round(r, 2), cex=2, col='black')
pval <- cor.test(x, y, method='pearson', use='pairwise.complete.obs')$p.value
sig <- symnum(pval, corr=FALSE, na=FALSE, cutpoints = c(0, 0.001, 0.01, 0.05, 0.1, 1), symbols = c('***', '**', '*', '.', ' '))
text(.6, .8, sig, cex=2, col='gray20')
}
panel.hist <- function(x, ...) {
usr <- par('usr'); on.exit(par(usr))
par(usr=c(usr[1:2], 0, 1.5))
h <- hist(x, plot=FALSE)
breaks <- h$breaks
nB <- length(breaks)
y <- h$counts; y <- y/max(y)
rect(breaks[-nB], 0, breaks[-1], y, col='lightblue', ...)
}
cols.key <- scales::muted(c('red', 'blue', 'green'))
cols.key <- adjustcolor(cols.key, alpha.f=1/4)
# pchs.key <- rep(19, 3)
# gr <- as.factor(1:3)
panel.scatter <- function(x, y){
# points(x, y, col=cols.key[gr], pch=19, cex=1)
points(x, y, col=sample(colours(),1),pch=19, cex=1)
lines(lowess(x, y))
}

539:卵の名無しさん
18/12/16 10:40:27.95 /hMzfoFS.net
pairs(xyz,
diag.panel=panel.hist,
lower.panel=panel.scatter,
upper.panel=panel.cor,
gap=0.5,
labels=gsub('\\.', '\n', colnames(xyz)),
label.pos=0.7,
cex.labels=1.4)
}
Nt <- 100
x <- sample(20:40, Nt, replace=TRUE)
y <- rnorm(Nt, 100, 15)
z <- rbinom(Nt, size=x, prob=0.5)
pairsxyz(x,y,z)
pairs も カスタマイズすればわりと使えるな。

540:卵の名無しさん
18/12/16 11:38:51.60 ZC5C+Eow.net
ニート ニート 働けニート
URLリンク(m.youtube.com)

541:卵の名無しさん
18/12/16 11:42:14.17 /hMzfoFS.net
Nt <- 100
set.seed(123)
Ti <- sample(20:40, Nt, replace=TRUE)
Xt <- rlnorm(Nt, 100, 15)
Yt <- rbinom(Nt, size=Ti, prob=0.8)
20-40人からなるド底辺シリツ学生のグループを100組集め


542:る。 各グループを代表する知能指数が正規分布をしている。 裏口の確率は80%である。 その線形回帰は glm(Yt ~ Xt, family=poisson(link="log"), offset=log(Ti))



543:卵の名無しさん
18/12/16 14:16:40.36 /hMzfoFS.net
source('tmp.tools.R')
library(Mass)
set.seed(71)
size <- 10000
x <- -seq(1/size,1,by=1/size)
shape <- 10.7
mu <- exp(3.7*x+2)
y1 <- sapply(mu, function(m)rnegbin(1, mu=m, theta=shape))
pairsxyz(cbind(x,y1,mu))
model_glmnb <- glm.nb(y1 ~ x)
summary(model_glmnb)
plot(x,y1,pch=19,col=rgb(.01,.01,.01,.02))
points(x,fitted(model_glmnb,seq(0,1,len=size)),col=0)
lines(x,model_glmnb$fitted)
points(x,mu,col=rgb(0,0,1,0.01),cex=0.5)
#
lambda <- sapply(mu,function(x) rgamma(1,shape=shape,scale=x/shape))
y2 <- sapply(lambda,function(x) rpois(1,x))
hist(y1,f=F,breaks=50)
hist(y2,f=F,breaks=50, add=T,col=5)

544:卵の名無しさん
18/12/16 20:30:27.72 /hMzfoFS.net
# ネットワークノード1..j..N
# ネットワーク内の客の数1..k..K、
# ノードjでの平均客数L[k,j]、通過時間W[k,j]、到着率lambda[k,j]
# mu[j]:サービス率,r[i,j]ノードiからjへの移行確率
# theta[j] = Σtheta[i](i=1,N) * r[i,j] の解がtheta
rm(list=ls())
theta=c(0.6,0.4)
mu=c(0.6,0.4)
N=2
K=10
L=W=lambda=matrix(rep(NA,N*K),ncol=N)
k=1
for(j in 1:N){
W[k,j]=1/mu[j]*(1+0)
}
tmp=numeric(N)
for(j in 1:N){
tmp[j]=theta[j]*W[k,j]
}
den=sum(tmp)
lambda[k,1]=k/den
for(j in 2:N){
lambda[k,j]=theta[j]*lambda[k,1]
}
for(j in 1:N){
L[k,j]=lambda[k,j]*W[k,j]
}

545:卵の名無しさん
18/12/16 20:30:52.05 /hMzfoFS.net
#
for(k in 2:K){
for(j in 1:N){
W[k,j]=1/mu[j]*(1 + L[k-1,j])
}
tmp=numeric(N)
for(j in 1:N){
tmp[j]=theta[j]*W[k,j]
}
den=sum(tmp)
lambda[k,1]=k/den
for(j in 2:N){
lambda[k,j]=theta[j]*lambda[k,1]
}
for(j in 1:N){
L[k,j]=lambda[k,j]*W[k,j]
}
}
L
W
lambda

546:卵の名無しさん
18/12/17 04:38:09.36 GOYrgwsC.net
minimize 2*b+4*sin(θ)/(cos(θ)-1/2)*α where (θ-sin(θ)/2+(sin(θ)/(cos(θ)-1/2))^2(α-sin(α))/2+(1-b)*sin(θ)/2=pi/8 ,0<b<1,0<θ<pi/2

547:卵の名無しさん
18/12/17 04:45:32.12 GOYrgwsC.net
minimize (2*b+4rα) where (θ-sinθ)/2+r^2(α-sinα)/2+(1-b)sinθ/2=pi/8 ,0<b<1,0<θ<pi/2

URLリンク(www.wolframalpha.com)(2*b%2B4r%CE%B1)++where+(%CE%B8-sin%CE%B8)%2F2%2Br%5E2(%CE%B1-sin%CE%B1)%2F2%2B(1-b)sin%CE%B8%2F2%3Dpi%2F8+,0%3Cb%3C1,0%3C%CE%B8%3Cpi%2F2

Standard computation time exceeded...
Try again with Pro computation time

548:卵の名無しさん
18/12/17 05:14:49.85 GOYrgwsC.net
rangeB = map (/1000) [1..1000]
rangeTheta = map (\x -> x * pi/2/1000) [1..1000]
rangeAlpha = map (\x -> x * pi/1000) [1..1000]
rangeR = map (\x -> x * 1/1000) [1000..10000]
re = [2*b+4*r*α| b<-rangeB,θ<-rangeTheta, α<-rangeAlpha,r<-rangeR,(θ-sin(θ))/2+r^2*(α-sin(α))/2+(1-b)*sin(θ)/2==pi/8]
main = do
print $ minimum re

549:卵の名無しさん
18/12/17 05:39:04.50 GOYrgwsC.net
rangeB = map (/1000) [1..1000]
rangeTheta = map (\x -> x * pi/2/1000) [1..1000]
rangeAlpha = map (\x -> x * pi/1000) [1..1000]
re = [(2*b+4*sin(θ)/(cos(θ)-1/2)*α)| b<-rangeB,θ<-rangeTheta, α<-rangeAlpha,(θ-sin(θ))/2+(sin(θ)/(cos(θ)-1/2))^2*(α-sin(α))/2+(1-b)*sin(θ)/2==pi/8]
main = do
print $ minimum re

550:卵の名無しさん
18/12/17 05:47:22.52 GOYrgwsC.net
URLリンク(ja.wolframalpha.com)(2*b%2B4r%CE%B1)++where+(%CE%B8-sin%CE%B8)%2F2%2Br%5E2(%CE%B1-sin%CE%B1)%2F2%2B(1-b)sin%CE%B8%2F2%3Dpi%2F8+,0%3Cb%3C1,0%3C%CE%B8%3Cpi%2F2,0%3C%CE%B1%3C2*pi

551:卵の名無しさん
18/12/17 05:47:36.95 GOYrgwsC.net
minimize(2*b+4rα) where (θ-sinθ)/2+r^2(α-sinα)/2+(1-b)sinθ/2=pi/8 ,0<b<1,0<θ<pi/2,0<α<2*pi

552:卵の名無しさん
18/12/17 13:52:12.63 FuhGkKV8.net
向学心のないコミュ障事務員のスレ
事務員と見せかけてその正体は大学受験に失敗したニートだろうな
二十歳前くらいの大学受験の知識で一生わたっていけると勘違いしているらしい
いや勘違いというか自分にそう言い聞かせなければいけないほど
人生終わってんだろうな
ハゲワロス

553:卵の名無しさん
18/12/17 13:59:09.34 N+SAyf9z.net
>>518
こういう野糞投稿しかできないのはド底辺シリツかな?
ド底辺スレから部屋割計算できなくて逃げ出したアホと同一人物?

554:卵の名無しさん
18/12/17 14:01:55.57 N+SAyf9z.net
>>518
向学心を語るなら>499の計算してからな。
ド底辺頭脳クン。

555:卵の名無しさん
18/12/17 14:02:51.74 FuhGkKV8.net
人生についての向学心は大学受験なんていう狭い領域で机上の空論をこねくり回すことではない
だがいつまでも不合格の受験生は、その領域から抜け出せなくなるんだなW
向学心のない事務員にふさわしいスレを持ってきてやったぞ
【因果応報】医学部再受験【自業自得】
スレリンク(kouri板)

556:卵の名無しさん
18/12/17 14:07:07.62 N+SAyf9z.net
>>521
>499は受験に無関係な臨床問題だよ。
答えてみ!
はよ!はよ!
向学心を語るなら>499の計算してからな。
ド底辺頭脳クン。

557:卵の名無しさん
18/12/17 14:08:05.38 FuhGkKV8.net
このスレもお勧めだぞW
【悲報】ワイの医学部志望の妹、精神壊れる
URLリンク(vippers.jp)

558:卵の名無しさん
18/12/17 14:09:08.10 N+SAyf9z.net
>>523
>>518
向学心を語るなら>499の計算してからな。
ド底辺頭脳クン。

559:卵の名無しさん
18/12/17 14:14:33.64 N+SAyf9z.net
ド底辺頭脳でもこれくらいできるかな?
12^2 = 144 ........................ 21^2 = 441
13^2 = 169 ........................ 31^2 = 961
二桁の数でこうなるのは他にある?
向学心も頭脳もないから答えられないだろうな。

560:卵の名無しさん
18/12/17 14:26:10.34 FuhGkKV8.net
さあそろそろ今日の宿題の問題を出題しといてやろうか
事務員には無理だろうけどな
さて問題です
ラブアンドピースとアヘ顔ダブルピースの相似性について原稿用紙30枚以上で考察せよ

561:卵の名無しさん
18/12/17 14:40:27.65 qP6ufigZ.net
>>525
2行で答がでる。
ド底辺頭脳には無理。
[(x,y)|x<-[1..9],y<-[1..9],let z=(10*x+y)^2,x<y,let a=z `div` 100,let b=z `mod` 100 `div` 10, let c=z `mod` 10,100*c+10*b+a==(10*y+x)^2]
[(x,y)|x<-[0..9],y<-[0..9],x<y,let z=(10*x+y)^2,let a=z `div` 100, let a1=a `div`10,let a2=a `mod` 10,
let b=z `mod` 100 `div` 10, let c=z `mod` 10,1000*c+100*b+a2*10+a1==(10*y+x)^2]

562:卵の名無しさん
18/12/17 14:43:19.14 qP6ufigZ.net
>>526
数値計算とか統計処理の必要な問題すらも作れないのは統計数理の素養がない馬鹿だからだろ。
臨床医ならこれくらいの計算ができる教養がほしいね。できなきゃド底辺シリツ医並の頭脳。

インフルエンザの迅速キットは特異度は高いが感度は検査時期によって左右される。
ある診断キットが開発されたとする。
このキットは特異度は99%と良好であったが、
感度については確かな情報がない。
事前確率分布として一様分布を仮定する。
50人を無作為抽出してこの診断キットで診断したところ40人が陽性であった。
この母集団の有病率の期待値と95%CIはいくらか?
またこの診断キットの感度の期待値と95%CIはいくらか

563:卵の名無しさん
18/12/17 19:41:34.06 FuhGkKV8.net
やはり低学歴ニートには答えられないんだな
参加賞で1曲あげといてやろう
URLリンク(www.youtube.com)

564:卵の名無しさん
18/12/17 19:55:33.62 N+SAyf9z.net
>>529
>>518
向学心を語るなら>499の計算してからな。
ド底辺頭脳クン。

565:卵の名無しさん
18/12/17 20:34:35.71 qP6ufigZ.net
source('tools.R')
ab=Mv2ab(0.70,0.01)
pbeta(0.80,ab[1],ab[2])-pbeta(0.60,ab[1],ab[2])
pbeta(0.90,ab[1],ab[2])-pbeta(0.50,ab[1],ab[2])
x=rbeta(1e5,ab[1],ab[2])
o=x/(1-x)
TP=0.80
FN=1-TP
TN=0.99
(nLR=FN/TN)
po=o*nLR^2
pp=po/(1+po)
BEST::plotPost(pp,compVal=0.10)

566:卵の名無しさん
18/12/17 20:34:41.41 qP6ufigZ.net
source('tools.R')
ab=Mv2ab(0.70,0.01)
pbeta(0.80,ab[1],ab[2])-pbeta(0.60,ab[1],ab[2])
pbeta(0.90,ab[1],ab[2])-pbeta(0.50,ab[1],ab[2])
x=rbeta(1e5,ab[1],ab[2])
o=x/(1-x)
TP=0.80
FN=1-TP
TN=0.99
(nLR=FN/TN)
po=o*nLR^2
pp=po/(1+po)
BEST::plotPost(pp,compVal=0.10)

567:卵の名無しさん
18/12/17 20:36:09.78 qP6ufigZ.net
インフルエンザ迅速検査キットの感度が80%、偽陽性率1%とする。
臨床的にはインフルエンザを疑うが迅速検査陰性、
不要な薬は使いたくない、と患者の要望。
検査が早期すぎるための偽陰性かと考えて翌日再検したが、こちらも陰性。
「私がインフルエンザである可能性はどれくらいありますか?
可能性が10%以上なら仕事を休んで抗ウイルス薬希望します。」
という。
臨床所見から疑われる有病率が70%程度(最頻値70%標準偏差10%)としたときにこの患者が仕事を休むことになる確率はいくらか?

568:卵の名無しさん
18/12/18 08:26:52.13 3rdYoIBg.net
バグに気づくのに時間がかかった、数学板に上げる前に気づいてよかった。
PQR = function(b,s){ # OQ=b ∠POQ=s
r=sin(s)/(cos(s)-1/2)
a=atan(sqrt(1^2+b^2-2*1*b*cos(s))/r) # <- WRONG!!
(s-sin(s))/2+r^2*(a-sin(a))/2+(1-b)*sin(s)/2
# (pi/2-s)/2 + b*sin(s)/2 - r^2*(a/2-sin(a)/2)
}
bb=seq(0,1,len=101)
ss=seq(0,pi/2,len=101)
z=outer(bb,ss,PQR)
image(bb,ss,z,xlab='b(OQ)',ylab='s(rad)')
contour(bb,ss,z,bty='l',nlevels=20,add=T, lty=3)
contour(bb,ss,z,levels=pi/8,lwd=2, add=T)
Persp3d(bb,ss,z)
b2s <- function(b){
uniroot(function(x) PQR(b,x)-pi/8, c(0,pi/2))$root
}
b2s=Vectorize(b2s)
L = function(b){ # 2b + 4ra
s=b2s(b)
r=sin(s)/(cos(s)-1/2)
a=atan(sqrt(1^2+b^2-2*1*b*cos(s))/r)
2*b + 4*r*a
}
L=Vectorize(L)
curve(L(x),0,pi/6,bty='l')
L(0)

569:卵の名無しさん
18/12/18 09:56:44.79 iW+brusm.net
こんな素朴な質問したら理解できない長文レスが数学化卒からきた。
4円弧モデルが最小ってどうすれば言えるの?
URLリンク(i.imgur.com)
URLリンク(i.imgur.com)
URLリンク(i.imgur.com)
の順に小さくなるのは計算できたけど。

570:卵の名無しさん
18/12/18 15:48:23.96 3rdYoIBg.net
暇つぶしにサムスカの太鼓持ち講演を聞いた。
相関係数を算出に全例調査しているのにp値を出していて
統計処理を理解していないアホだとわかったのが面白かった。

571:卵の名無しさん
18/12/18 15:50:29.76 3rdYoIBg.net
>>536
まあ、聞いているやつが(ド底辺シリツ医大卒のようなアホが多数で)p<0.001とか出せばエビデンスレベルが高いと誤解するだろうとわかっての所作なら策士だとは思うが。

572:卵の名無しさん
18/12/18 15:55:06.24 3rdYoIBg.net
こんなのがあんのね
電解質Na,K専用測定器 Fingraph
俺は夜間休日は血ガス測定で代用してたけど。

573:卵の名無しさん
18/12/18 21:56:13.92 RRjIHldX.net
3S Policy Causes the ResultTruman of Panama document and 3S policy
We are keeping the citizens in a cage named "Freedom of Falsehood".
The way you just give them some luxury and convenience.Then release sports, screen, sex (3S).
Because the citizens are our livestock. For that reason, we must make it longevity. It makes it sick
(with chemicals etc.) and keeps it alive.This will keep us harvesting. This is also the authority
of the victorious country.The medal and the Nobel prize is not all Raoul declarationExamples of 3S policy
Hypocrites and disguised society and Panama document "He moved here here two years ago, I was afraid
of looking, but I thought it was a polite person to greet" Hello "when I saw it ... It was not like I was waking
this kind of incident ... ... "(Neighboring residents)On November 7, Shosuke Hotta, 42, a self-proclaimed office
worker in Sagamihara City, Kanagawa Prefecture, was arrested on suspicion of abusing her daughter Sakurai Ai.
This is the nature of the Earthlings

574:卵の名無しさん
18/12/18 23:30:22.38 rfcy7s34.net
本日も事務員放送の終了時間となりました
URLリンク(m.youtube.com)

575:卵の名無しさん



576:sage
>>540 相関係数を算出に全例調査しているのにp値を出だすのが 何でアホと言われるかわかる?



577:卵の名無しさん
18/12/19 13:50:09.99 CUSSzVDj.net
>>541
わからないからp値だしているのか
わからない>540のような馬鹿につけこんでいるのか、
どっちだろうな。
サイコロが2回続けて1の目出ました。
その確率は1/6*1/6=0.02777で0.05未満だから
サイコロは有意差をもって歪(いびつ)である、
即ち、1の目のでる確率=1/6という帰無仮説は棄却される
というのは正しいか?
これに即答できんアホはこのスレに書く基礎学力なし。

578:卵の名無しさん
18/12/19 16:34:10.87 3mCL+IGn.net
さて問題です
ガチユリとガチムチの違いを原稿用紙30枚以上で述べよ

579:卵の名無しさん
18/12/19 16:43:43.16 CUSSzVDj.net
>>543
>>540
相関係数を算出に全例調査しているのにp値を出だすのが
何でアホと言われるかわかる?
サイコロが2回続けて1の目出ました。
その確率は1/6*1/6=0.02777で0.05未満だから
サイコロは有意差をもって歪(いびつ)である、
即ち、1の目のでる確率=1/6という帰無仮説は棄却される
というのは正しいか?
オマエ、これに即答できんアホだろ。

580:卵の名無しさん
18/12/19 18:33:47.66 3mCL+IGn.net
問題に即答できんとは
さてはニートだな

581:卵の名無しさん
18/12/19 19:18:36.88 CUSSzVDj.net
>>545
統計スレで統計問題を書けないとはド底辺シリツ頭脳だな。

582:卵の名無しさん
18/12/19 20:12:36.56 3mCL+IGn.net
開業医でないのに開業スレに書きこむ
非医師のニート脳が何か言ってるなW

583:卵の名無しさん
18/12/19 21:12:41.91 CUSSzVDj.net
>>547
開業医スレに
こういうのを書いたら礼を言われましたよ。
URLリンク(egg.2ch.net)

584:卵の名無しさん
18/12/19 21:13:24.16 CUSSzVDj.net
>>547
サイコロが2回続けて1の目が出ました。
その確率は1/6*1/6=0.02777で0.05未満だから
サイコロは有意差をもって歪(いびつ)である、
即ち、1の目のでる確率=1/6という帰無仮説は棄却される
というのは正しいか?
オマエ、これに即答できんアホだろ。

585:卵の名無しさん
18/12/19 21:24:51.44 CUSSzVDj.net
>>547
ニート脳の学力すらないどアホがオマエな。
オマエ、これに即答できんアホだろ。
統計スレなんだから
これに答えてみ!はよ!はよ!
サイコロが2回続けて1の目が出ました。
その確率は1/6*1/6=0.02777で0.05未満だから
サイコロは有意差をもって歪(いびつ)である、
即ち、1の目のでる確率=1/6という帰無仮説は棄却される
というのは正しいか?

586:卵の名無しさん
18/12/19 21:25:04.74 3mCL+IGn.net
非医師ニートくんは
スレ1の説明も読めないようだ
スレリンク(hosp板:1番)

587:卵の名無しさん
18/12/19 21:28:31.22 CUSSzVDj.net
>>551
スルーできないアホがオマエじゃん。
これに即答できんアホだろ。
統計スレなんだから
これに答えてみ!はよ!はよ!
サイコロが2回続けて1の目が出ました。
その確率は1/6*1/6=0.02777で0.05未満だから
サイコロは有意差をもって歪(いびつ)である、
即ち、1の目のでる確率=1/6という帰無仮説は棄却される
というのは正しいか?

588:卵の名無しさん
18/12/19 21:49:54.61 CUSSzVDj.net
>>551
URLリンク(egg.2ch.net)
までの議論(>77が俺)は
非医者ニートとの会話だと思う?
相当頭が悪そうだな。
これに即答できんアホだろ。統計スレなんだから
これに答えてみ!はよ!はよ!
サイコロが2回続けて1の目が出ました。
その確率は1/6*1/6=0.02777で0.05未満だから
サイコロは有意差をもって歪(いびつ)である、
即ち、1の目のでる確率=1/6という帰無仮説は棄却される
というのは正しいか?

589:卵の名無しさん
18/12/19 23:57:49.27 3mCL+IGn.net
今日もニートの歌
URLリンク(m.youtube.com)

590:卵の名無しさん
18/12/20 04:19:04.11 b33W7V5i.net
>>554
URLリンク(egg.2ch.net)
の議論(>77が俺)は
非医者ニートとの会話だと思う?
相当頭が悪そうだな。
これに即答できんアホだろ。統計スレなんだから
これに答えてみ!はよ!はよ!
サイコロが2回続けて1の目が出ました。
その確率は1/6*1/6=0.02777で0.05未満だから
サイコロは有意差をもって歪(いびつ)である、
即ち、1の目のでる確率=1/6という帰無仮説は棄却される
というのは正しいか?

591:卵の名無しさん
18/12/20 08:39:31.68 YfbLPysN.net
>>547
開業医スレに
こういうのを書いたら礼を言われましたよ。
URLリンク(egg.2ch.net)
非医師ニートに教えてもらって例を言ってるのも非医師ニートなのか。二人から褒めるレスが返って来たんだが。

統計スレなんだから!これに答えてみ!はよ!はよ!
サイコロが2回続けて1の目が出ました。
その確率は1/6*1/6=0.02777で0.05未満だから
サイコロは有意差をもって歪(いびつ)である、
即ち、1の目のでる確率=1/6という帰無仮説は棄却される
というのは正しいか?

592:卵の名無しさん
18/12/20 19:49:02.89 LEZzzwW7.net
事務員の日常
URLリンク(www.nicovideo.jp)

593:卵の名無しさん
18/12/20 20:49:22.03 s4OL7Lza.net
>>557
URLリンク(egg.2ch.net)
の議論(>77が俺)は
非医者ニートとの会話だと思う?
相当頭が悪そうだな。
これに即答できんアホだろ。統計スレなんだから
これに答えてみ!はよ!はよ!
サイコロが2回続けて1の目が出ました。
その確率は1/6*1/6=0.02777で0.05未満だから
サイコロは有意差をもって歪(いびつ)である、
即ち、1の目のでる確率=1/6という帰無仮説は棄却される
というのは正しいか?

594:卵の名無しさん
18/12/20 22:04:13.70 aEbz7irJ.net
It is common knowledge among doctors and patients that Do-Teihen(exclusively bottom-leveled medical school) graduates mean morons who bought their way to Gachi'Ura(currently called by themselves)
According to the experience of entrance exam to medical school in the era of Showa, when the sense of discrimination against
privately-founded medical schools were more intense than it is now,
all such schools but for Keio had been so compared to some specialized institution for educable mentally retarded kids that nobody but imbecile successors of physicians in private pr


595:actice had applied for admission. There had been NOT a single classmate who chose willingly against his/her common sense to go to the Do-Teihen(exclusively bottom-leveled medical school, currently also known as Gachi'Ura), which would have cost outrageous money and its graduates are destined to be called Uraguchi morons who bought thier way into the Do-Teihen, by thier colleagues and even by thier own clients. Although people won't call them names to their face, certain 80-90% people of about my age have been yet scorning and sneering at Uraguchi graduates, speaking in the back of our mind, " Uraguchi morons shall not behave like somebody." We never speak out face to face in real life.



596:卵の名無しさん
18/12/21 07:36:37.26 RO6zf9jd.net
リンゲル液を凍らせた。
室温に放置して固相と液相が共存している時の液相の浸透圧は
元のリンゲル液より高いか低いかを即答できないのが
ド底辺シリツ医な、オマエも即答できんのじゃね。
ある学会でリンゲル液と同じと答えたアホがいたな。

597:卵の名無しさん
18/12/21 08:36:03.18 9yiQ3K91.net
>>559
ド底辺シリツ医にもわかるように原文をつけておけよ。
>>
私は昭和の時代に大学受験したけど、昔は今よりも差別感が凄く、特殊民のための特殊学校というイメージで開業医のバカ息子以外は誰も受験しようとすらしなかった。
常識的に考えて、数千万という法外な金を払って、しかも同業者からも患者からもバカだの裏口だのと散々罵られるのをわかって好き好んでド底辺医に行く同級生は一人もいませんでした。
本人には面と向かっては言わないけれど、俺くらいの年代の人間は、おそらくは8-9割はド底辺医卒を今でも「何偉そうなこと抜かしてるんだ、この裏口バカが」と心の底で軽蔑し、嘲笑しているよ。
当の本人には面と向かっては絶対にそんなことは言わないけどね。
<<

598:卵の名無しさん
18/12/21 12:14:03.53 oQHNIYqE.net
It is common knowledge among doctors and patients that Do-Teihen(exclusively bottom-leveled medical school) graduates mean morons who bought their way to Gachi'Ura(currently called by themselves)
According to the experience of entrance exam to medical school in the era of Showa, when the sense of discrimination against
privately-founded medical schools were more intense than it is now,
all such schools but for Keio had been so compared to some specialized institution for educable mentally retarded kids that nobody but imbecile successors of physicians in private practice had applied for admission.
There had been NOT a single classmate who chose willingly against his/her common sense to go to the Do-Teihen(exclusively bottom-leveled medical school, currently also known as Gachi'Ura),
which would have cost outrageous money and its graduates are destined to be called Uraguchi morons who bought thier way into the Do-Teihen, by thier colleagues and even by thier own clients.
Although people won't call them names to their face,
certain 80-90% people of about my age have been yet scorning and sneering at Uraguchi graduates, speaking in the back of our mind,
" Uraguchi morons shall not behave like somebody."
We never speak out face to face in real life.

599:卵の名無しさん
18/12/21 17:03:49.74 JdSFbP47.net
 「イグっ&#9829; イグううぅーー&#9829; 鋼太郎、池袋にイっちゃうのおおぉぉ!」

600:卵の名無しさん
18/12/21 19:52:00.45 b22UegL5.net
age

601:卵の名無しさん
18/12/22 14:08:40.70 Ihwj4uih.net
URLリンク(www.nicovideo.jp)

602:卵の名無しさん
18/12/23 12:00:45.56 9jfRvGpH.net
f=c(179,28,19,13,9,7,6,5,5,4,4,4,5,7,9,10,11,12,14,16,18,19,19,20,21,22,23,24,25,27,28,30,
31,34,37,39,41,43,46,51,57,63,70,77,83,91,99,109,119,130,142,155,167,178,190,202,216,
233,249,265,282,302,326,354,387,420,457,502,549,598,648,700,761,836,927,1026,1142,1284,
1455,1651,1862,2089,2341,2625,2934,3264,3598,3923,4233,4508,4740,4893,4973,5007,4999,
4729,4314,3797,3222,2634,2071,1566,1135,788,523,761)
m=c(191,31,21,13,10,8,8,8,7,7,7,8,9,11,14,17,21,26,32,37,42,46,49,50,50,50,49,49,50,52,55,
58,60,63,65,67,71,76,82,89,97,104,112,122,134,148,165,183,203,224,246,268,294,324,357,
391,425,461,502,549,601,659,722,792,872,958,1052,1147,1239,1331,1433,1546,1663,1783,
1905,2026,2167,2333,2532,2750,2973,3195,3414,3630,3827,4000,4133,4200,4194,4104,3916,
3681,3388,3046,2669,2272,1875,1494,1145,841,589,392,246,144,79,71)
LE <-function(ndx,Y,N0=10^5){ # life expectancy
n=length(ndx)
lx=numeric(n)
lx[1]=N0
for(i in 1:(n-1))
lx[i+1] <- lx[i] - ndx[i]
nqx=ndx/lx
nLx=numeric(n)
for(i in 1:n)
nLx[i] <- mean(c(lx[i],lx[i+1]))
nLx[n]=0
Tx=rev(cumsum(rev(nLx)))
le=Tx/lx
return(round(le[Y+1],1))
}

603:卵の名無しさん
18/12/23 12:02:35.17 9jfRvGpH.net
Y=1:105
sapply(Y,function(x) LE(f,x))
sapply(Y,function(x) LE(m,x))
Y[sapply(Y,function(x) LE(m,x))<5]
sapply(Y,function(x) LE(f,x))
sapply(Y,function(x) LE(m,x))
Y=1:105
Y[sapply(Y,function(x) LE(f,x))<5]
Y[sapply(Y,function(x) LE(m,x))<5]

604:卵の名無しさん
18/12/23 18:51:20.54 u874lVPY.net
メリークリスマス
URLリンク(m.youtube.com)

605:卵の名無しさん
18/12/24 13:54:15.39 muWLHtMs.net
平均余命(縦線)と「平均寿命-現年齢」(点線の斜線)をグラフにしてみた。
URLリンク(i.imgur.com)

606:卵の名無しさん
18/12/24 19:08:03.81 L4b+RVwf.net
URLリンク(m.youtube.com)

607:卵の名無しさん
18/12/24 20:36:41.73 6ZVUEdxI.net
他スレで喚いて荒らしていても
算数クイズくんが
底辺から抜け出すことは
困難を極めます

608:卵の名無しさん
18/12/24 22:12:45.55 lZLAiNKc.net
開業医スレに
こういうのを書いたら礼を言われましたよ。
URLリンク(egg.2ch.net)

609:卵の名無しさん
18/12/24 22:21:17.70 lZLAiNKc.net
>>571
これ理科のクイズ。
リンゲル液を凍らせた。
室温に放置して固相と液相が共存している時の液相の浸透圧は
元のリンゲル液より高いか低いかを即答できないのが
ド底辺シリツ医な、オマエも即答できんのじゃね。
ある学会でリンゲル液と同じと答えたアホがいたな。

610:卵の名無しさん
18/12/25 09:25:20.23 Lx1BgrzL.net
平均余命の信頼区間を計算しようと思ったが
各年齢での人口データがないと無理だな。

611:卵の名無しさん
18/12/26 00:18:55.39 rHMA/ZVK.net
さて国語の問題です
信じて送り出したフタナリ事務員が農家の叔父さんの・・・・・
続きを原稿用紙30枚以上で作成せよ

612:卵の名無しさん
18/12/26 20:53:45.05 0RdixcRl.net
clinical sense の症例が配信されてきた。
Devic病と思ったら経過中にレルミット兆候が出てMSに診断変更。
インターフェロンβ→ナタリズマブの前にステロイドパルスがないのが解せなかったな。

613:卵の名無しさん
18/12/26 23:30:42.66 wApOj4Hd.net
ところでMS法人って
みんな作ってる?

614:卵の名無しさん
18/12/27 14:17:15.36 7ElT0ESI.net
Welch.test=function(n1,n2,m1,m2,sd1,sd2){
T=(m1-m2)/sqrt(sd1^2/n1+sd2^2/n2)
df=(sd1^2/n1+sd2^2/n2)^2 / (sd1^4/n1^2/(n1-1)+sd2^4/n2^2/(n2-1))
p.value=2*pt(abs(T),df,lower.tail = FALSE)
return(c(p.value=p.value,t.statistic=T))
}
# white zoneの視認性と腺管密度の関係
# white zoneが鮮明な癌 窩間部の長さ136±45 (p<0.05)
# white zoneが不鮮明な癌 窩間部の長さ77±22 (p<0.05)
m1=136
sd1=45
m2=77
sd2=22
n2p <- function(n){
Welch.test(n,n,m1,sd1,m2,sd2)[1]
}
n2p=Vectorize(n2p)
plot(2:15,sapply(2:15,n2p),bty='l',pch=19)
abline(h=0.05)

615:卵の名無しさん
18/12/27 14:47:38.86 7ElT0ESI.net
# se=sd/√n , sd=se*√n
n2p_se <- function(n){
sd1=sd1*sqrt(n)
sd2=sd2*sqrt(n)
Welch.test(n,n,m1,sd1,m2,sd2)[1]
}
n2p_se=Vectorize(n2p_se)
n2p_se(5)
plot(n,sapply(n,n2p_se),bty='l',pch=19,ylim=c(0,1))
abline(h=c(0.01,0.05),col=8)
n2p_se(18:22)

616:卵の名無しさん
18/12/27 15:17:44.83 7ElT0ESI.net
# sim
# white zoneが鮮明な癌 窩間部の長さ136±45 (p<0.05)
# white zoneが不鮮明な癌 窩間部の長さ77±22 (p<0.05)
n=7
y1=scale(rnorm(n))*45 + 136
y2=scale(rnorm(n))*22 + 77
library(BEST)
BESTout=BESTmcmc(y1,y2)
# Look at the result:
BESTout
summary(BESTout)
plot(BESTout)
plot(BESTout, "sd")
plotPostPred(BESTout)
plotAll(BESTout, credMass=0.8, ROPEm=c(-0.1,0.1),
ROPEeff=c(-0.2,0.2), compValm=0.5)
plotAll(BESTout, credMass=0.8, ROPEm=c(-0.1,0.1),
ROPEeff=c(-0.2,0.2), compValm=0.5, showCurve=TRUE)
summary(BESTout, credMass=0.8, ROPEm=c(-0.1,0.1), ROPEsd=c(-0.15,0.15),
ROPEeff=c(-0.2,0.2))
pairs(BESTout)

617:卵の名無しさん
18/12/27 15:20:39.76 7ElT0ESI.net
white zoneの視認性と腺窩の深さの関係
white zoneが鮮明な癌 腺窩の深さ 180±47 (p<0.001)
white zoneが不鮮明な癌 腺窩の深さ 81±20 (p<0.001)

618:卵の名無しさん
18/12/27 15:25:25.68 7ElT0ESI.net
>>581
m1=180
sd1=47
m2=81
sd2=20
n2p <- function(n){
Welch.test(n,n,m1,sd1,m2,sd2)[1]
}
n2p=Vectorize(n2p)
n=2:10
plot(n,sapply(n,n2p),bty='l',pch=19)
abline(h=c(0.001,0.01),col=8)
n2p(5:10)

619:卵の名無しさん
18/12/27 15:30:09.78 7ElT0ESI.net
m1=180
sd1=47
m2=81
sd2=20
n2p <- function(n){
Welch.test(n,n,m1,sd1,m2,sd2)[1]
}
n2p=Vectorize(n2p)
n=2:10

# se=sd/√n , sd=se*√n
n2p_se <- function(n){
sd1=sd1*sqrt(n)
sd2=sd2*sqrt(n)
Welch.test(n,n,m1,sd1,m2,sd2)[1]
}
n2p_se=Vectorize(n2p_se)
n=25:35
plot(n,sapply(n,n2p_se),bty='l',pch=19,ylim=c(0,0.05))
abline(h=c(0.001,0.01),col=8)
n2p_se(27:32)

620:卵の名無しさん
18/12/27 15:30:31.81 7ElT0ESI.net
サンプルサイズが推定できて、気分が( ・∀・)イイ!!

621:卵の名無しさん
18/12/27 21:28:20.91 ZlVEHwaK.net
アイドル映像でも見て もちつけ
URLリンク(m.youtube.com)

622:卵の名無しさん
18/12/27 22:51:46.90 gYAr3TuJ.net
qqct.jp
URLリンク(bvdeur67.secure.ne.jp)

623:卵の名無しさん
18/12/28 00:56:18.13 Oc+hTpm3.net
日本にも、
ついに朝鮮殺戮殺人カルト宗教
殺人学会の、
テロ工作拠点が明らかになった!
テロ工作拠点
福山友愛病院
なんと日本警察に朝鮮殺戮殺人学会が侵入し、
カルトによる被害者側を警察が拉致して連れていくテロ工作拠点の一角!!
警察と完全犯罪達成の為に、共同組織犯罪をやっていて、
与えられていたのは、
犯罪ライセンス!!!!!!

薬物大量投与テロ発生!!
なんと故意に八倍!!!
カミサカというテロ医師による、
偽造カルテ作成発覚!!
なんとその為に監禁罪をやっていた!!!

624:卵の名無しさん
18/12/28 13:38:51.13 4e3e1x1A.net
直線解ならプログラム組めそうだけど答が円弧を含むなら
俺の能力では無理だな。
こういう問題を解ける頭脳には平伏するだけだな。

5等分の場合はこんな形が解になるそうです
URLリンク(imgur.com)
正三角形5等分問題だと解が完全に非対称的な形になって面白い
URLリンク(imgur.com)

625:卵の名無しさん
18/12/28 15:09:23.16 4e3e1x1A.net
自分がどれだけ馬鹿なのか自覚できていいな。
三角形なら直線で左右対象だろうとアプリオリに決めつけてプログラムしちゃうよなぁ。

626:卵の名無しさん
18/12/28 15:10:49.35 4e3e1x1A.net
理系で一番馬鹿なのが医学部を実感するなぁ。

627:卵の名無しさん
18/12/29 12:03:59.78 8oggYPKD.net
分岐角度が120°、対象図形と分割線のなす角が90°という
いわゆるplatoの法則で立式しないとコンピュータ解も難しそう。

628:卵の名無しさん
18/12/29 12:25:15.44 8oggYPKD.net
>>721
4分割ですらの正答出せなかった。
URLリンク(i.imgur.com)
URLリンク(i.imgur.com)
URLリンク(i.imgur.com)
の順に小さくなるのは計算できたけど。

629:卵の名無しさん
2018/12/30


630:(日) 15:37:28.61 ID:NpJOUauM.net



631:卵の名無しさん
18/12/31 21:09:11.51 2cJ2vbGs.net
開業するのかw大晦日にw

632:卵の名無しさん
18/12/31 23:39:12.39 anCmupmN.net
数学板の統計スレにこんな課題があったのでシミュレーション解を投稿しておいた。

例えば、母集団から50枚の答案用紙を選んで、平均が
60点だとする。母集団は2500枚の答案用紙から成り立っているとして、平均は70点とする。このとき50枚の答案用紙をランダムに選んだかの検定はどの
ようにすればいいでしょうか。(つまり60点の平均点が低いので、ランダムに選んだかどうかを疑っているわけです。)

633:卵の名無しさん
19/01/01 10:02:25.14 fQ4brTV9.net
甲乙二人がおのおの32ピストル(当時のお金の単位)の金を賭けて勝負したとする。
 そしてどちらかが先に3点を得たものを勝ちとし、勝った方がかけ金の総額64ピストルをもら
 えるとする。ところが甲が2点、乙が1点を得たとき、勝負が中止になってしまった。
 このとき、二人のかけ金の総額64ピストルを甲と乙にどのように分配すればよいだろうか。
 ただし二人の力は互角で、勝つ確率はそれぞれ1/2ずつだとする。
プログラムで計算させてみる
n=0:1
x=expand.grid(n,n,n,n,n)
y=x[apply(x[,1:3],1,sum)==2,]
64*sum(apply(y,1,sum)>2)/nrow(y)

634:卵の名無しさん
19/01/01 21:19:05.09 nLWjX1/M.net
インフルエンザ脳症成人例は死亡率が高い
URLリンク(www.niid.go.jp)

p0_4=c(14,202)
p5_19=c(20,408)
p20_59=c(7,72)
p60_=c(10,66)
p.mat=as.matrix(rbind(p0_4,p5_19,p20_59,p60_))
chisq.test(p.mat)
pairwise.prop.test(p.mat,p.adjust='holm')
fmsb::pairwise.fisher.test(p.mat)
p.mat
prop.test(c(34,17),c(610,138))
Fisher.test(c(34,17),c(610,138)

635:卵の名無しさん
19/01/03 18:09:59.16 6cY0SNEs.net
## m sd n
A=c(159.0625,sqrt(3924.729167),16)
B=c(240,sqrt(22027.5),17)
C=c(366.35,sqrt(5329.292105),20)
lh=rbind(A,B,C)
colnames(lh)=c("m","sd","n") ; lh
mean.G=sum(lh[,"m"]*lh[,"n"])/sum(lh[,"n"])
SS.bit=sum((lh[,"m"]-mean.G)^2*lh[,"n"])
SS.wit=sum(lh[,"sd"]^2*(lh[,"n"]-1))
df.bit=nrow(lh)-1
df.wit=sum(lh[,"n"]-1)
MS.bit=SS.bit/df.bit
MS.wit=SS.wit/df.wit
(F.ratio=MS.bit/MS.wit)
pf(F.ratio,df.bit,df.wit,lower.tail=FALSE)
(η2=(SS.bit)/(SS.bit+SS.wit))
A=c(159.0625,sqrt(3924.729167),16)
B=c(240,sqrt(22027.5),17)
C=c(366.35,sqrt(5329.292105),20)
a=A[1]+scale(rnorm(A[3]))*A[2]
b=B[1]+scale(rnorm(B[3]))*B[2]
c=C[1]+scale(rnorm(C[3]))*C[2]
x=c(a,b,c)
g=c(rep('A',A[3]),rep('B',B[3]),rep('C',C[3]))
g=factor(g,labels=LETTERS[1:3])
pairwise.t.test(x,g,p.adjust='holm')


次ページ
最新レス表示
レスジャンプ
類似スレ一覧
スレッドの検索
話題のニュース
おまかせリスト
オプション
しおりを挟む
スレッドに書込
スレッドの一覧
暇つぶし2ch