高校数学の質問スレ(医者・東大卒専用) Part438 (991レス)
上下前次1-新
抽出解除 レス栞
リロード規制です。10分ほどで解除するので、他のブラウザへ避難してください。
75(1): 2024/08/17(土)14:49:16.87 ID:mowI5mD2(4/4) AAS
In[3]:= Table[solve[n],{n,1,10}]
7 5 4 2 7 19 7 9
Out[3]= {1, -, --, --, -, --, --, -, --, 1}
9 12 35 7 15 30 9 10
119: 2024/08/21(水)19:14:25.87 ID:EiqnP9Ex(4/5) AAS
>>117
>>69にはいつまでダンマリ決め込んでんだよ?
184: 2024/08/28(水)03:21:35.87 ID:oo0Tk9dt(1) AAS
>>181
>>183
嶋田信幸49歳
ポイ活必死ですね 馬鹿ですね
258: 2024/10/27(日)12:07:23.87 ID:Ll/mJg+e(2/5) AAS
>>255
5chですら必死にレス乞食しても高校生にすら相手にされない老害が死に損ない以外の何だって言うんだよw
314(1): 2024/11/17(日)20:28:28.87 ID:WtMlI/FM(1) AAS
>>313
何この図
TeX使えませんってアピール?
342: 2024/11/29(金)06:08:12.87 ID:d3rJHsIX(1) AAS
# 10桁のカプレカー数を列挙するプログラムを作り実行せよ
n=10
library(RcppAlgos)
is.kaprekar=\(m){
IntegerDigits=\(n) as.integer(unlist(strsplit(as.character(n),'')))
le=length(m)
mu=10^((le-1):0)
min=sum(sort(m)*mu)
max=sum(sort(m,decreasing = TRUE)*mu)
n=sum(m*mu)
d=max-min
sum(sort(IntegerDigits(d))*mu)==min & min!=max
}
cm=comboGeneral(0:9,n,repetition = TRUE)
re=cm[apply(cm,1,is.kaprekar),]
kaprekar=\(m){
le=length(m)
mu=10^((le-1):0)
min=sum(sort(m)*mu)
max=sum(sort(m,decreasing = TRUE)*mu)
n=sum(m*mu)
max-min
}
apply(re,1,kaprekar)
370: 2024/12/03(火)14:26:15.87 ID:xACthNhN(1) AAS
Wolfram Language 14.0.0 Engine for Microsoft Windows (64-bit)
Copyright 1988-2023 Wolfram Research, Inc.
In[1]:= nn=1234;
In[2]:= n=5;
In[3]:= m=6;
In[4]:= ass2list[ass_] := Select[Table[{key,ass[key]},{key,0,m}],IntegerQ[#[[2]]]&] (* assosiation to list ,key:[0,m] *)
In[5]:= xyz=Solve[Mod[x+y+z,m]==0 && 0<=x<=y<=z<=(m-1),{x,y,z},Integers];
In[6]:= t1=Table[{x/.xyz[[n]],y/.xyz[[n]],z/.xyz[[n]]},{n,1,Length@xyz}];
In[7]:= ass=Counts[#]& /@ t1;
In[8]:= li=ass2list /@ ass;
In[9]:= {q,r}=QuotientRemainder[nn,m];
In[10]:= c=Flatten@{Table[q+1,r],Table[q,m-r]};
In[11]:= m2c[x_] :=( (* mod to how many cases *)
i=If[x[[1]]==0,m,x[[1]]];
Binomial[c[[i]],x[[2]]]
)
In[12]:= prod[x_] := Product[tmp,{tmp,x}];
In[13]:= cases=Total[prod /@ (m2c /@ # & /@ li)];
In[14]:= cases/Binomial[nn,n]
126691
Out[14]= -----------
57547841736
492(1): 2024/12/30(月)21:39:27.87 ID:dmM3LvbP(2/2) AAS
>>491
クレクレレス乞食って自分で出した問題すら解けずに逃走するアンタのことだろ
550: 01/11(土)23:12:46.87 ID:WI+T/Kwt(2/3) AAS
COVID-19の潜伏期はμ=1.6 、σ=0.5の対数正規分布(オレンジ色)に
インフルエンザの潜伏期は形状母数k=2.0,尺度母数θ=1.0のガンマ分布(青色)に従うとする。
画像リンク
同時に感染したときにインフルエンザの方が先に発症する確率を求めなさい。
分布は独立でウイルス干渉はないものとする。
pdfz =\(z) integrate( \(x) dlnorm(x,1.6,0.5) * dgamma(x-z,shape=2,scale=1),
0,Inf,rel.tol = 1e-12)$value
pdfz=Vectorize(pdfz)
curve(pdfz(x),-10,30)
1-integrate(pdfz,-Inf,0,rel.tol = 1e-12)$value
k=1e7
Cov=rlnorm(k,1.6,0.5)
Flu=rgamma(k,shape=2,scale=1)
plotPost(Cov-Flu,compVal = 0,col=7)
curve(pdfz(x),add=TRUE,lwd=2)
mean(Cov>Flu)
画像リンク
597: 01/21(火)08:19:52.87 ID:TjYqVp68(2/2) AAS
>>591
医者だったらログイン時間付きの学会画面くらい出せんだろ?
さっさとアップしてこいよ悔しかったら
717(4): 02/12(水)16:15:05.87 ID:sK/q3f4l(1) AAS
臨床応用問題
インフルエンザの咽頭画像AI診断支援機器(AI群)は
従来のイムノクロマト法による抗原検査(immuno群)よりも発症12時間以内での感度が高いという。
ある試験ではAI群14/17 immuno群11/17であった。
【問題】
(1) 「AI群はimmuno群より感度が高い」を「両群の感度は同じ」を帰無仮説として有意差検定せよ。
(2) AI群の感度がimmuno群の1倍以上である確率、1.5倍以上である確率、2倍以上である確率を求めよ。
(3) r = AI群の感度/immuno群の感度としてrの分布を図示せよ
(4) r の95%信頼区間を算出せよ
算出に必要な条件は適宜設定してよい。
(1)くらいはFラン卒でもできると思う。
778: 04/10(木)06:36:42.87 ID:rUVTD6v0(2/6) AAS
"
コイン9個を3行3列の枠に表を上にして配置する。コインを
1 2 3
4 ? 6
7 8 9
とする。5のコインだけが裏返っており、残りは表が上である。
無作為に1個のコインを選ぶ。選ばれたコインはそのままで、上下左右に隣接するコインを裏返す。
同じコインを複数回選んでもよい。
この操作をn回繰り返した後にすべてのコインが裏返っている確率をQ[n]とする。
n=1,2,...,20の各々でQ[n]を求めよ。
"
B=A
for(i in 1:9) B[i,i]=0
f2=\(i) apply(B,1,\(v) b2n(bitwXor(n2b(i),v)))
M2=matrix(0,ncol=512,nrow=512)
colnames(M2)=0:511
rownames(M2)=0:511
for(i in 0:511) M2[as.character(i),as.character(f2(i))]=1/9
b2n(c(0,0,0,0,1,0,0,0,0)) # 16
solve2=\(n) (M2 %^%n)["16","511"]
solve2=Vectorize(solve2)
m=1:20
cbind(m,solve2(m))
#
flip2 <- function(v) {
# 隣接マップ
li <- list(
c(2, 4), # 1
c(1, 3, 5), # 2
c(2, 6), # 3
c(1, 5, 7), # 4
c(2, 4, 6, 8), # 5
c(3, 5, 9), # 6
c(4, 8), # 7
c(5, 7, 9), # 8
c(6, 8) # 9
)
# 初期状態
state <- rep(0, 9)
state[5] <- 1
for (pos in v) {
# 選ばれた位置と隣接するコインを反転
for (idx in li[[pos]]) {
state[idx] <- 1 - state[idx]
}
}
return(state)
}
sim=\(n,verbose=FALSE){
v=sample(9,n,replace=TRUE)
res=sum(flip2(v))==9
if(verbose & res) cat(v,'\n')
invisible(res)
}
del=replicate(1e3,sim(3,TRUE))
res=numeric()
for(n in 1:20) res[n]=mean(replicate(1e5,sim(n)))
re=solve2(m)
cbind(m,round(re,4),res)
plot(re)
points(res,type='h',col=4,lwd=3)
Qn=solve2(1:100)
par(mar=c(4,4,4,4))
plot(Qn,type='l',xlab='n',ylab='Q[n]')
points(res)
825: 05/04(日)19:45:41.87 ID:Ie2Wyhjx(1) AAS
CRANからパッケージBESTが消えていたのでplotPostと同等機能の関数を復刻(不適当データ入力などエラー回避処理は面倒なのでやってない)。
画像リンク
This function helps visualize posterior distribution samples from Bayesian inference and displays various informative elements. It can show the mean, mode, median, a credible interval (either HDI or quantiles), the Region of Practical Equivalence (ROPE), and a comparison value.
Arguments:
posterior_samples: A numeric vector of posterior distribution samples.
credMass: The width of the credible interval (a numeric value between 0 and 1; default is 0.95).
ROPE: A numeric vector specifying the ROPE range (e.g., c(lower_bound, upper_bound)).
compVal: A numeric value for comparison.
showMean: A logical value indicating whether to display the mean (TRUE/FALSE).
showMode: A logical value indicating whether to display the mode (TRUE/FALSE).
showMedian: A logical value indicating whether to display the median (TRUE/FALSE).
showCurve: A logical value indicating whether to display a density plot (TRUE/FALSE; if FALSE, a histogram is shown).
showQuantile: A logical value indicating whether to display the credible interval as quantiles instead of HDI (TRUE/FALSE).
xlab: The label for the x-axis.
main: The title of the plot.
hist_color: The color of the histogram.
textSize: The size of the text elements.
yaxt: The y-axis style (default is to show only numbers).
...: Additional arguments to be passed to the plotting function.
959: 06/28(土)18:46:59.87 ID:v3isfyag(1) AAS
>>958
聞くなら言語学板で聞け
そういうとこだぞ
上下前次1-新書関写板覧索設栞歴
スレ情報 赤レス抽出 画像レス抽出 歴の未読スレ
ぬこの手 ぬこTOP 0.060s