高校数学の質問スレ(医者・東大卒専用) Part438 (991レス)
高校数学の質問スレ(医者・東大卒専用) Part438 http://rio2016.5ch.net/test/read.cgi/math/1723152147/
上
下
前
次
1-
新
通常表示
512バイト分割
レス栞
463: 132人目の素数さん [sage] 2024/12/22(日) 18:41:54.83 ID:rWRciXK9 >444に答えてあげればいいのに。 それもできないのでFラン確定! fd=\(lat1,lon1,lat2,lon2,R){ R*acos( sin(lat1)*sin(lat2)+cos(lat1)*cos(lat2)*cos(lon1-lon2) ) } fd(pi/5,0,pi/3,pi/2,1) http://rio2016.5ch.net/test/read.cgi/math/1723152147/463
464: 132人目の素数さん [sage] 2024/12/22(日) 19:03:14.31 ID:bA66atg/ >>463 死ね http://rio2016.5ch.net/test/read.cgi/math/1723152147/464
465: 132人目の素数さん [sage] 2024/12/22(日) 20:14:10.65 ID:gaGlxwVG >>463 スレタイに則った書き込みすればいいのに それもできないのでホイ卒確定 http://rio2016.5ch.net/test/read.cgi/math/1723152147/465
466: 132人目の素数さん [sage] 2024/12/22(日) 21:03:18.86 ID:rWRciXK9 spherical_triangle_area <- function(R, a, b, c) { # 直交座標への変換 to_cartesian <- function(lat, lon) { c(cos(lat) * cos(lon), cos(lat) * sin(lon), sin(lat)) } p <- to_cartesian(a[1], a[2]) q <- to_cartesian(b[1], b[2]) r <- to_cartesian(c[1], c[2]) # 辺のベクトルを計算 u_ab <- q - p u_bc <- r - q u_ca <- p - r # 内角を計算 angle_between <- function(u, v) { acos(sum(u * v) / (sqrt(sum(u^2)) * sqrt(sum(v^2)))) } alpha <- angle_between(u_ab, -u_ca) beta <- angle_between(u_bc, -u_ab) gamma <- angle_between(u_ca, -u_bc) # 超過角を計算 E <- alpha + beta + gamma - pi # 球面三角形の面積を計算 R^2 * E } http://rio2016.5ch.net/test/read.cgi/math/1723152147/466
467: 132人目の素数さん [sage] 2024/12/22(日) 22:19:23.50 ID:ODwmJOyZ https://i.imgur.com/Q34Vduy.jpeg >>466 http://rio2016.5ch.net/test/read.cgi/math/1723152147/467
468: 132人目の素数さん [sage] 2024/12/22(日) 22:32:49.57 ID:DH2naynY 類は何とやら キチガイはキチガイをよぶ http://rio2016.5ch.net/test/read.cgi/math/1723152147/468
469: 132人目の素数さん [sage] 2024/12/23(月) 08:08:07.50 ID:5pyB+nba キチガイが複数人いるより、キチガイの自演の方が自然 http://rio2016.5ch.net/test/read.cgi/math/1723152147/469
470: 132人目の素数さん [sage] 2024/12/28(土) 09:03:58.56 ID:pTaNTUpL Wolfram Language 14.0.0 Engine for Microsoft Windows (64-bit) Copyright 1988-2023 Wolfram Research, Inc. In[1]:= 4 * Integrate[Sqrt[r^2-x^2]-r/2,{x,r/2,r*Sqrt[3]/2}] 2 r (-3 (-1 + Sqrt[3]) r + Pi Sqrt[r ]) Out[1]= ------------------------------------- 3 In[2]:= r=6 Out[2]= 6 In[3]:= f[p_,o_] := Total[(p-o)^2] <= r^2 In[4]:= f4[p_] :=( AllTrue[{f[p,{0,0}],f[p,{r,0}],f[p,{r,r}],f[p,{0,r}]},#==True&] ) In[5]:= ratio=f4 /@ Tuples[Range[0,r,0.001],2] // Boole // Mean; In[6]:= r^2 * ratio // N Out[6]= 11.3415 In[7]:= 11.3415 http://rio2016.5ch.net/test/read.cgi/math/1723152147/470
471: 132人目の素数さん [sage] 2024/12/28(土) 10:20:03.06 ID:byAnFSyo >>470 137:卵の名無しさん:[sage]:2024/12/27(金) 16:30:06.83 ID:UPA/6UxQ レス乞食じゃなきゃ然るべきスレでやるもんね http://rio2016.5ch.net/test/read.cgi/math/1723152147/471
472: 132人目の素数さん [sage] 2024/12/28(土) 12:26:13.98 ID:ABHDoLY/ 横綱、大関、関脇で巴戦を行う。 2力士が対戦して,勝った方が残りの 1 力士と対戦をする。 これを繰り返して,2連勝した力士が優勝をする。 勝利確率は通算成績に従うとする(巴戦での成績も組み入れて計算する) 巴戦前の通算成績は 横綱 対 大関は 横綱の10勝9負 大関 対 関脇は 大関の 8勝7負 横綱 対 関脇は 横綱の 6勝5負 とする。 大関 対 関脇で巴戦を始めるときにそれぞれの力士の優勝する確率を算出しなさい。 http://rio2016.5ch.net/test/read.cgi/math/1723152147/472
473: 132人目の素数さん [sage] 2024/12/28(土) 12:27:13.74 ID:ABHDoLY/ sim=\(){ h12=c(10,9) # bout3 h23=c(8,7) # bout1 h13=c(6,5) # bout2 bout=1 last_winner=0 flg= FALSE count=0 while(!flg){ count=count+1 if(bout==1){ i=2-rbinom(1,1,h23[1]/sum(h23)) h23[i]=h23[i]+1 winner=c(2,3)[i] bout=c(2,3)[-i] } if(bout==2){ i=2-rbinom(1,1,h13[1]/sum(h13)) h13[i]=h13[i]+1 winner=c(1,3)[i] bout=c(1,3)[-i] } if(bout==3){ i=2-rbinom(1,1,h12[1]/sum(h12)) h12[i]=h12[i]+1 winner=c(1,2)[i] bout=c(1,2)[-i] } flg <- winner==last_winner last_winner=winner } c(winner=winner,count=count) } t(replicate(100,sim())) http://rio2016.5ch.net/test/read.cgi/math/1723152147/473
474: 132人目の素数さん [sage] 2024/12/28(土) 12:43:10.85 ID:ABHDoLY/ sim=function(){ h12=c(10,9) # bout3 横綱1vs大関2 h23=c(8,7) # bout1 大関2vs関脇3 h13=c(6,5) # bout2 横綱1vs関脇3 bout=1 # 初戦の試合番号 last_winner=0 # 前勝者 flg= FALSE # 連勝フラッグ count=0 # 試合数 while(!flg){ count=count+1 if(bout==1){ i=2-rbinom(1,1,h23[1]/sum(h23)) # 勝者のindex h23[i]=h23[i]+1 # 通算成績更新 winner=c(2,3)[i] # 勝者番号 bout=c(2,3)[-i] # 敗者番号=次の試合番号 } if(bout==2){ i=2-rbinom(1,1,h13[1]/sum(h13)) h13[i]=h13[i]+1 winner=c(1,3)[i] bout=c(1,3)[-i] } if(bout==3){ i=2-rbinom(1,1,h12[1]/sum(h12)) h12[i]=h12[i]+1 winner=c(1,2)[i] bout=c(1,2)[-i] } flg <- winner==last_winner last_winner=winner } c(winner=winner,count=count) } t(replicate(100,sim())) http://rio2016.5ch.net/test/read.cgi/math/1723152147/474
475: 132人目の素数さん [sage] 2024/12/28(土) 14:17:39.00 ID:1sBW2m9k " 横綱、大関、関脇で巴戦を行う。 2力士が対戦して,勝った方が残りの 1 力士と対戦をする。 これを繰り返して,2連勝した力士が優勝をする。 勝利確率は通算成績に従うとする(巴戦での成績も組み入れて計算する) 巴戦前の通算成績は 横綱 対 大関は 横綱の10勝9負 大関 対 関脇は 大関の 8勝7負 横綱 対 関脇は 横綱の 6勝5負 とする。 (1) 大関 対 関脇で巴戦を始めるときにそれぞれの力士の優勝する確率を算出しなさい。 (2) 巴戦の試合数の期待値を求めなさい。 http://rio2016.5ch.net/test/read.cgi/math/1723152147/475
476: 132人目の素数さん [sage] 2024/12/28(土) 14:21:31.42 ID:2IDswPeZ 尿瓶ジジイのレス乞食はいつになったら願いが届くのかな?w http://rio2016.5ch.net/test/read.cgi/math/1723152147/476
477: 132人目の素数さん [sage] 2024/12/28(土) 18:11:22.23 ID:wnhYoY4/ >>476 あなたが返信してる時点で目的を達してる 完全スルーができないならスレを見ないで欲しい http://rio2016.5ch.net/test/read.cgi/math/1723152147/477
478: 132人目の素数さん [sage] 2024/12/28(土) 19:00:53.56 ID:byAnFSyo 尿瓶ジジイはそんなにバカにされたいのかねぇww http://rio2016.5ch.net/test/read.cgi/math/1723152147/478
479: 132人目の素数さん [sage] 2024/12/29(日) 07:54:27.11 ID:/ygSVCno rm(list=ls()) library(RcppAlgos) pm12=permuteGeneral(0:1,12,repetition = TRUE) colnames(pm12)=LETTERS[1:12] f12=\(x){ A=x[1];B=x[2];C=x[3];D=x[4] E=x[5];F=x[6];G=x[7];H=x[8] I=x[9];J=x[10];K=x[11];L=x[12] all( (A==1 & A==1) | (A==0 & A==0), # A 「私は正直者である」 (B==1 & A==0) | (B==1 & A==1), # B 「Aは嘘つきである」 (C==1 & B==0) | (C==1 & B==1), # C 「Bは嘘つきである」 (D==1 & C==0) | (D==1 & C==1), # D 「Cは嘘つきである」 (E==1 & A==1) | E==0, # E 「Aは正直者である」 (F==1 & B==1) | F==0, # F 「Bは正直者である」 (G==1 & C==1) | G==0, # G 「Cは正直者である」 (H==1 & D==1) | H==0, # H 「Dは正直者である」 I==1 | (I==0 & E==1), # I 「Eは嘘つきである」 J==1 | (J==0 & F==1), # J 「Fは嘘つきである」 K==1 | (K==0 & G==1), # K 「Gは嘘つきである」 L==1 | (L==0 & H==1)) # L 「Hは嘘つきである」 } re=pm12[apply(pm12,1,f12),] colnames(re)[colSums(re)==nrow(re)] http://rio2016.5ch.net/test/read.cgi/math/1723152147/479
480: 132人目の素数さん [sage] 2024/12/29(日) 11:24:48.82 ID:8wG+CYHS バク頭脳のFimoseくんには解決できない問題 >479のバグを指摘せよ。 http://rio2016.5ch.net/test/read.cgi/math/1723152147/480
481: 132人目の素数さん [sage] 2024/12/29(日) 11:25:58.82 ID:bEHNzlJY バグ頭脳って自己紹介ですか?w http://rio2016.5ch.net/test/read.cgi/math/1723152147/481
482: 132人目の素数さん [sage] 2024/12/29(日) 12:22:06.12 ID:90INKYGd Rの単純なコードも読めないのが確定。 やっぱり、Fラン卒みたいだね。 http://rio2016.5ch.net/test/read.cgi/math/1723152147/482
483: 132人目の素数さん [sage] 2024/12/29(日) 12:47:08.60 ID:lQcX1F1j >>482 日本語も読めないのが確定 やっぱりチンパンだね http://rio2016.5ch.net/test/read.cgi/math/1723152147/483
484: 132人目の素数さん [sage] 2024/12/29(日) 14:05:39.63 ID:bEHNzlJY 尿瓶ジジイ医者でも東大卒でもないのにこのスレばっか伸びてるのほんと図々しいなw http://rio2016.5ch.net/test/read.cgi/math/1723152147/484
485: 132人目の素数さん [sage] 2024/12/29(日) 23:58:05.11 ID:/vJ/3Q0O 尿瓶ジジイまたダンマリかよ? http://rio2016.5ch.net/test/read.cgi/math/1723152147/485
486: 132人目の素数さん [sage] 2024/12/30(月) 03:14:24.14 ID:DAgtZ3Zg # 遷移行列 P <- matrix(c( 0, 0.5, 0.5, 0, 0, # S0: 初戦 A vs B 0, 0, 0, 0.5, 0.5, # S1: A vs C 0, 0, 0, 0.5, 0.5, # S2: B vs C 0.5, 0, 0, 0, 0.5, # S3: 再試合 A vs B 0.5, 0, 0, 0.5, 0 # S4: 再試合 B vs A ), nrow = 5, byrow = TRUE) # 固有値と固有ベクトルの計算 eig <- eigen(t(P)) stationary <- Re(eig$vectors[, which(abs(Re(eig$values) - 1) < 1e-8)]) stationary <- stationary / sum(stationary) # 各プレイヤーの勝率を計算 A_win <- stationary[2] + stationary[4] B_win <- stationary[3] + stationary[5] C_win <- stationary[1] cat("定常分布:\n") print(stationary) cat(sprintf("\nAの勝率: %.3f\n", A_win)) cat(sprintf("Bの勝率: %.3f\n", B_win)) cat(sprintf("Cの勝率: %.3f\n", C_win)) http://rio2016.5ch.net/test/read.cgi/math/1723152147/486
487: 132人目の素数さん [sage] 2024/12/30(月) 03:17:30.79 ID:DAgtZ3Zg (* 遷移行列の定義 *) P = { {0, 0.5, 0.5, 0, 0}, (* S0: 初戦 A vs B *) {0, 0, 0, 0.5, 0.5}, (* S1: A vs C *) {0, 0, 0, 0.5, 0.5}, (* S2: B vs C *) {0.5, 0, 0, 0, 0.5}, (* S3: 再試合 A vs B *) {0.5, 0, 0, 0.5, 0} (* S4: 再試合 B vs A *) }; (* 遷移行列の転置 *) PT = Transpose[P]; (* 固有値と固有ベクトルの計算 *) {eigValues, eigVectors} = Eigensystem[PT]; (* 固有値1に対応する固有ベクトル *) stationaryVector = Select[eigVectors, Norm[PT.# - #] & /@ eigValues == 1 ][[1]]; (* 正規化(確率の総和を1にする) *) stationaryVector = stationaryVector/Total[stationaryVector]; (* 各プレイヤーの勝率を計算 *) AWin = stationaryVector[[2]] + stationaryVector[[4]]; BWin = stationaryVector[[3]] + stationaryVector[[5]]; CWin = stationaryVector[[1]]; (* 結果表示 *) {stationaryVector, AWin, BWin, CWin} http://rio2016.5ch.net/test/read.cgi/math/1723152147/487
488: 132人目の素数さん [sage] 2024/12/30(月) 03:31:36.28 ID:DAgtZ3Zg # 遷移行列 P <- matrix(c( 0, 0.5, 0.5, 0, 0, # S0: 初戦 A vs B 0, 0, 0, 0.5, 0.5, # S1: A vs C 0, 0, 0, 0.5, 0.5, # S2: B vs C 0.5, 0, 0, 0, 0.5, # S3: 再試合 A vs B 0.5, 0, 0, 0.5, 0 # S4: 再試合 B vs A ), nrow = 5, byrow = TRUE) # 固有値と固有ベクトルの計算 eig <- eigen(t(P)) stationary <- Re(eig$vectors[, which(abs(Re(eig$values) - 1) < 1e-8)]) stationary <- stationary / sum(stationary) # 各プレイヤーの勝率を計算 A_win <- stationary[2] + stationary[4] B_win <- stationary[3] + stationary[5] C_win <- stationary[1] cat("定常分布:\n") print(stationary) cat(sprintf("\nAの勝率: %.3f\n", A_win)) cat(sprintf("Bの勝率: %.3f\n", B_win)) cat(sprintf("Cの勝率: %.3f\n", C_win)) http://rio2016.5ch.net/test/read.cgi/math/1723152147/488
489: 132人目の素数さん [sage] 2024/12/30(月) 03:34:00.29 ID:DAgtZ3Zg (* 遷移行列の定義 *) P = { {0, 0.5, 0.5, 0, 0}, (* S0: 初戦 A vs B *) {0, 0, 0, 0.5, 0.5}, (* S1: A vs C *) {0, 0, 0, 0.5, 0.5}, (* S2: B vs C *) {0.5, 0, 0, 0, 0.5}, (* S3: 再試合 A vs B *) {0.5, 0, 0, 0.5, 0} (* S4: 再試合 B vs A *) }; (* 遷移行列の転置 *) PT = Transpose[P]; (* 固有値と固有ベクトルの計算 *) {eigValues, eigVectors} = Eigensystem[PT]; (* 固有値1に対応する固有ベクトル *) stationaryVector = Select[eigVectors, Norm[PT.# - #] & /@ eigValues == 1 ][[1]]; (* 正規化(確率の総和を1にする) *) stationaryVector = stationaryVector/Total[stationaryVector]; (* 各プレイヤーの勝率を計算 *) AWin = stationaryVector[[2]] + stationaryVector[[4]]; BWin = stationaryVector[[3]] + stationaryVector[[5]]; CWin = stationaryVector[[1]]; (* 結果表示 *) {stationaryVector, AWin, BWin, CWin} http://rio2016.5ch.net/test/read.cgi/math/1723152147/489
490: 132人目の素数さん [sage] 2024/12/30(月) 10:41:19.52 ID:dmM3LvbP >>482 自分の問題すら碌に解けないチンパンジーだったみたい http://rio2016.5ch.net/test/read.cgi/math/1723152147/490
491: 132人目の素数さん [sage] 2024/12/30(月) 21:13:17.75 ID:DAgtZ3Zg >>490 類似問題のコードを弄るだけなのに クレクレ レス乞食かよ。 http://rio2016.5ch.net/test/read.cgi/math/1723152147/491
492: 132人目の素数さん [sage] 2024/12/30(月) 21:39:27.87 ID:dmM3LvbP >>491 クレクレレス乞食って自分で出した問題すら解けずに逃走するアンタのことだろ http://rio2016.5ch.net/test/read.cgi/math/1723152147/492
493: 132人目の素数さん [sage] 2024/12/31(火) 07:15:10.51 ID:41bOMap+ (* 応用問題 600×nの三乗根が正整数になるnの最小値を求めよ 演習問題 1234567890×nの五乗根が正整数になるnの最小値を求めよ *) solve[x_,m_:3] := Times@@(FactorInteger[x][[All,1]]^Mod[(m-Mod[FactorInteger[x][[All,2]],m]),m]) solve[600,3] solve[1234567890,5] http://rio2016.5ch.net/test/read.cgi/math/1723152147/493
494: 132人目の素数さん [sage] 2024/12/31(火) 07:15:43.90 ID:41bOMap+ >>492 レス乞食のために答を算出するRのコードを底辺シリツ医スレにアップしておいたから 実行してみ。 http://rio2016.5ch.net/test/read.cgi/math/1723152147/494
495: 132人目の素数さん [sage] 2024/12/31(火) 10:02:09.35 ID:6B6ig4bh >>494 これ答えじゃないよな? レス乞食さん http://rio2016.5ch.net/test/read.cgi/math/1723152147/495
496: 132人目の素数さん [sage] 2024/12/31(火) 14:55:01.89 ID:41bOMap+ EpiCycloid[R_,r_] := Module[ {circleA,circleB,redPoint,redPointTrace,frames,theta}, (* theta:Bの中心の偏角 *) circleA = Circle[{0, 0}, R]; circleB[theta_] := Circle[{(R+r) Cos[theta], (R+r) Sin[theta]}, r]; redPoint[theta_] := {(R+r) Cos[theta] + r Cos[(r+R)/r theta + Pi], (R+r) Sin[theta] + r Sin[(R+r)/r theta + Pi]}; (* 赤点の軌跡を保存するためのリスト *) redPointTrace = Table[redPoint[theta], {theta, 0, 2 Pi, 2 Pi/100}]; (* 円Bの中心を円Aの円周に沿って移動させるためのアニメーション *) frames = Table[ Show[ Graphics[{EdgeForm[Black], FaceForm[None], circleA}], Graphics[{EdgeForm[None], FaceForm[Red], circleB[theta]}], Graphics[{Red, PointSize[Large], Point[redPoint[theta]]}], Graphics[{Red, Line[redPointTrace[[1 ;; Round[theta/ (2 Pi/100)]]]]}], PlotRange -> {{-2(R+r), 2(R+r)}, {-2(R+r), 2(R+r)}}, Axes -> True, AxesOrigin -> {0, 0} ], {theta, 0, 2 Pi, 2 Pi/100}]; (* アニメーション表示 *) ListAnimate[frames] ] EpiCycloid[3,1] HypoCycloid[R_,r_] := Module[ {circleA,circleB,redPoint,theta,frames}, (* theta 円Bの中心の偏角 *) circleA = Circle[{0, 0}, R]; circleB[theta_] := Circle[{(R - r) Cos[theta], (R - r) Sin[theta]}, r]; redPoint[theta_] := {(R-r) Cos[theta] + r Cos[(1-R/r) theta], (R-r) Sin[theta] + r Sin[(1-R/r) theta]}; (* 円Bの中心を円Aの円周に沿って移動させるためのアニメーション *) frames = Table[ Show[ Graphics[{EdgeForm[Black], FaceForm[None], circleA}], Graphics[{EdgeForm[None], FaceForm[Red], circleB[theta]}], Graphics[{Red, PointSize[Large], Point[redPoint[theta]]}], Graphics[{Red, Line[Table[redPoint[theta], {theta, 0, 2 Pi, 2 Pi/100}]]}], PlotRange -> {{-R, R}, {-R, R}}, Axes -> True, AxesOrigin -> {0, 0} ], {theta, 0, 2 Pi, 2 Pi/100} ]; (* アニメーションを表示 *) ListAnimate[frames] ] HypoCycloid[3,1] http://rio2016.5ch.net/test/read.cgi/math/1723152147/496
497: 132人目の素数さん [sage] 2024/12/31(火) 14:56:07.64 ID:41bOMap+ >>495 実行すれば答がでるだろ。 証言をすべてみたす組み合わせのすべてで嘘つきになるのを列挙すればいい。 Rコード読めないの? http://rio2016.5ch.net/test/read.cgi/math/1723152147/497
498: 132人目の素数さん [sage] 2024/12/31(火) 18:47:36.81 ID:B87FjDFd >>497 結局グダグダ言い訳してるが自分の問題すら答えられないアホってことね http://rio2016.5ch.net/test/read.cgi/math/1723152147/498
499: 132人目の素数さん [sage] 2024/12/31(火) 23:12:32.74 ID:PjhLbT7v >>497 さすが答えの意味分かってないwww http://rio2016.5ch.net/test/read.cgi/math/1723152147/499
500: 132人目の素数さん [sage] 2025/01/01(水) 08:56:34.48 ID:trf8HhUX ハイポサイクロイド https://i.imgur.com/Y699ttV.gif http://rio2016.5ch.net/test/read.cgi/math/1723152147/500
501: 132人目の素数さん [sage] 2025/01/01(水) 11:12:05.21 ID:vYaE/f7n >>500 年明けても日本語読めないみたいだな http://rio2016.5ch.net/test/read.cgi/math/1723152147/501
502: 132人目の素数さん [sage] 2025/01/03(金) 19:11:24.08 ID:KUn71WA0 https://i.imgur.com/PiWG2FN.gif http://rio2016.5ch.net/test/read.cgi/math/1723152147/502
503: 132人目の素数さん [sage] 2025/01/03(金) 20:33:58.18 ID:gmyxpwxe 高校生にすら相手にされてないみたいだね 実に哀れ http://rio2016.5ch.net/test/read.cgi/math/1723152147/503
504: 132人目の素数さん [sage] 2025/01/03(金) 22:47:45.54 ID:KUn71WA0 https://i.imgur.com/XfJfU12.gif http://rio2016.5ch.net/test/read.cgi/math/1723152147/504
505: 132人目の素数さん [sage] 2025/01/03(金) 23:25:35.89 ID:rOKue8hC >>482 荒らすの止めてくれないか http://rio2016.5ch.net/test/read.cgi/math/1723152147/505
506: 132人目の素数さん [sage] 2025/01/03(金) 23:25:35.96 ID:gmyxpwxe さっさと精神科行け http://rio2016.5ch.net/test/read.cgi/math/1723152147/506
507: 132人目の素数さん [sage] 2025/01/05(日) 12:23:25.71 ID:tuC7O64g R=3; r=2; K=2; (* ロータ中心と頂点距離/ロータギア半径 *) apex[t_] := Module[ {p,c,d}, p = {(R-r) Cos[t] + R Cos[(t+Pi)/3], (R-r) Sin[t] + R Sin[(t+Pi)/3]}; c = {(R-r) Cos[t],(R-r) Sin[t]}; d = K(p-c)+c ] theta=Flatten@{Range[0,6 Pi, Pi/1000]}; ListPlot[apex[#]& /@ theta,AspectRatio ->1] x[t_]:=apex[t][[1]] y[t_]:=apex[t][[2]] length=Integrate[(D[x[t],t])^2+(D[y[t],t])^2,{t,0,6 Pi}] area=(1/2) Integrate[x[t] D[y[t],t] - y[t] D[x[t],t],{t,0, 6 Pi}] Clear[{R,r,K}] http://rio2016.5ch.net/test/read.cgi/math/1723152147/507
508: 132人目の素数さん [sage] 2025/01/05(日) 12:47:54.51 ID:/2bPdu/v >>507 まだバカにされたりないのか尿瓶ジジイは しかし正規のスレじゃもうバカにすらしてもらえないみたいww http://rio2016.5ch.net/test/read.cgi/math/1723152147/508
509: 132人目の素数さん [sage] 2025/01/07(火) 19:53:08.02 ID:rJfoFeSd 【問題】 固定円の半径を2、回転ローターの円の半径を3とするときに ルーローの三角の軌跡の内部でローターが移動できるには三角の頂点とロータ円の中心の距離が 回転ローターの円の半径の何倍以上であることが必要ですか? > 2/3*(2+sqrt(3)) [1] 2.488034 http://rio2016.5ch.net/test/read.cgi/math/1723152147/509
510: 132人目の素数さん [sage] 2025/01/07(火) 22:35:53.49 ID:zsZUtuIb >>509 高校数学で回転ローターとやらが定義されてるのかよwww 中卒以下の低脳でまともに数学用語使えないゴミなのはしょうがないけど、もう少し努力しろよwww http://rio2016.5ch.net/test/read.cgi/math/1723152147/510
511: 132人目の素数さん [sage] 2025/01/08(水) 02:59:50.29 ID:0uIf2Djd ルーローって魯肉のことだな http://rio2016.5ch.net/test/read.cgi/math/1723152147/511
512: 132人目の素数さん [sage] 2025/01/08(水) 04:11:37.72 ID:X/URcmTf rm(list=ls()) JugRiddle <- function( big=5, small=3, end=4){ # starting from the bigger jug movebig <- function(xy){ # start from c(big,0) x=xy[1] ; y=xy[2] # x==big if(x==big) re=c(big-(small-y),small) # x==0 if(x==0) re=c(big,y) # y==small if(y==small) re=c(x,0) # y==0 if(y==0 & x!=big){ if(x>=small) re=c(x-small,small) else re=c(0,x) } return(re) } STATUS=status=c(big,0) i=1 while(!identical(status,c(0,0))){# i=i+1 status=movebig(status) STATUS=rbind(STATUS,status) } rownames(STATUS)=1:nrow(STATUS) colnames(STATUS)=c(paste0(big,'L'),paste0(small,'L')) (Bigger=STATUS) # starting from the smaller jug movesmall <- function(xy){ # start from c(0,small) x=xy[1] ; y=xy[2] if(y==small){ if(x<=(big-small)) re=c(x+small,0) else re=c(big, small-(big-x)) } if(y==0) re=c(x,small) if(x==big) re=c(0,y) if(x==0) re=c(y,0) return(re) } STATUS=status=c(0,small) i=1 while(!identical(status,c(0,0))){ # i=i+1 status=movesmall(status) STATUS=rbind(STATUS,status) } rownames(STATUS)=1:nrow(STATUS) colnames(STATUS)=c(paste0(big,'L'),paste0(small,'L')) (Smaller=STATUS) if(all(end != c(Bigger,Smaller))) return(NA) min_Bigger=min(which(apply(Bigger,1,function(x) end %in% x))) min_Smaller=min(which(apply(Smaller,1,function(x) end %in% x))) list(Bigger=as.matrix(Bigger)[1:min_Bigger,], Smaller=as.matrix(Smaller)[1:min_Smaller,], min_Bigger=min_Bigger,min_Smaller=min_Smaller) } JugRiddle(5,3,4) JugRiddle(10,5,3) http://rio2016.5ch.net/test/read.cgi/math/1723152147/512
513: 132人目の素数さん [sage] 2025/01/08(水) 19:26:21.90 ID:SKdwPI7I コイントスの終了条件を Aくんは、 表が2回連続して出たら終了 Bくんは、 表裏の順に出たら終了(裏表の順では終了しない) することになった。 (1) Aくん、Bくんについて、コイントスの回数の期待値を求めよ。 (2) Aくんはの方が少ない回数で終了する確率を求めよ。小数解でよい。 http://rio2016.5ch.net/test/read.cgi/math/1723152147/513
514: 132人目の素数さん [sage] 2025/01/08(水) 19:29:44.12 ID:X/URcmTf >>513 (2)回数の差の分布 https://i.imgur.com/jDZubdl.png http://rio2016.5ch.net/test/read.cgi/math/1723152147/514
515: 132人目の素数さん [sage] 2025/01/08(水) 20:16:25.91 ID:X/URcmTf >>514 https://i.imgur.com/cmdTCLY.png http://rio2016.5ch.net/test/read.cgi/math/1723152147/515
516: 132人目の素数さん [sage] 2025/01/08(水) 20:27:25.85 ID:bjQ79ehj 日本語すら読めないチンパンジーが数学やった気になってるのか http://rio2016.5ch.net/test/read.cgi/math/1723152147/516
517: 132人目の素数さん [sage] 2025/01/08(水) 20:27:57.47 ID:SKdwPI7I >>513 1000万回のシミュレーション https://i.imgur.com/JKpHsKb.png https://i.imgur.com/A1NiFF0.png http://rio2016.5ch.net/test/read.cgi/math/1723152147/517
518: 132人目の素数さん [sage] 2025/01/08(水) 20:28:49.92 ID:SKdwPI7I >>516 罵倒しか投稿できないのがFimoseくん。FランにちなんでPhimoseくんから昇格w http://rio2016.5ch.net/test/read.cgi/math/1723152147/518
519: 132人目の素数さん [sage] 2025/01/08(水) 20:30:20.34 ID:SKdwPI7I >>517 期待値の差よりも 回数の差の分布の方が直感に近いな。 http://rio2016.5ch.net/test/read.cgi/math/1723152147/519
520: 132人目の素数さん [sage] 2025/01/08(水) 20:33:00.33 ID:bjQ79ehj チンパンジーが図星で発狂中w http://rio2016.5ch.net/test/read.cgi/math/1723152147/520
521: 132人目の素数さん [sage] 2025/01/09(木) 00:40:37.23 ID:bJYGsz4u >>518 他人がどうこうなんてお前が無能な事とは全く関係ないんだから、まずは国語の勉強してスレタイくらい読めるようになれよwwww 汚い言葉勉強してる場合じゃないぞwww http://rio2016.5ch.net/test/read.cgi/math/1723152147/521
522: 132人目の素数さん [sage] 2025/01/09(木) 06:57:53.73 ID:0PPPIAFh やはり、下手な考え休むに似たりだな。 オッペンハイマーでの会話 Hahn and Strassmann in Germany. They split the uranium nucleus. How? Bombard it with neutrons. It's a nuclear fission. They did it, they split the atom. It's not possible. I'm gonna try to reproduce it. See? Can't be done. Very elegant. Quite clear. http://rio2016.5ch.net/test/read.cgi/math/1723152147/522
523: 132人目の素数さん [sage] 2025/01/09(木) 07:00:06.18 ID:0PPPIAFh Fimoseくんはロータリーエンジンの動くシェーマの動画を作れないの? 完成した動画をみてもハウジングが何かわからんようだし。 やっぱり、弄れるのはforeskinだけみたいだね。 http://rio2016.5ch.net/test/read.cgi/math/1723152147/523
524: 132人目の素数さん [sage] 2025/01/09(木) 08:14:29.03 ID:jj9pV73T >>522 アンタのことじゃん http://rio2016.5ch.net/test/read.cgi/math/1723152147/524
525: 132人目の素数さん [sage] 2025/01/09(木) 08:14:47.34 ID:o9+qLk7l limit = 10000 max_count = 0 best_n = 0 for (n in 1:(limit - 1)) { count = 0 for (y in 1:(n - 1)) { if ((n*y) %% (n-y) ==0 & n!=y){ # x が整数になる条件 count = count + 1 } } if (count > max_count) { max_count = count best_n = n } } best_n max_count http://rio2016.5ch.net/test/read.cgi/math/1723152147/525
526: 132人目の素数さん [sage] 2025/01/09(木) 08:16:10.89 ID:o9+qLk7l nを10000未満の正整数とする。 1/n+1/x=1/y を満たす{x,y}の正整数解の組み合わせの数が最大なnはいくつか? http://rio2016.5ch.net/test/read.cgi/math/1723152147/526
527: 132人目の素数さん [sage] 2025/01/09(木) 12:34:42.59 ID:1fujxzuR こういう報道に接するとZ3が必須だな。 https://www.373news.com/_news/storyid/155006/ http://rio2016.5ch.net/test/read.cgi/math/1723152147/527
528: 132人目の素数さん [sage] 2025/01/09(木) 12:35:57.90 ID:1fujxzuR >>524 映画みてないの? 英語がわからないFラン? http://rio2016.5ch.net/test/read.cgi/math/1723152147/528
529: 132人目の素数さん [sage] 2025/01/09(木) 17:28:07.32 ID:6xzpzcRA >>528 下手な考え休むに似たりって完全にアンタのことなんだけどまさか自覚ないんか?ww http://rio2016.5ch.net/test/read.cgi/math/1723152147/529
530: 132人目の素数さん [sage] 2025/01/10(金) 02:04:06.88 ID:sfHDQvoL >>523 他人がどうこうとか自分の無能を誤魔化すばっかりwww 自分で定義分かってるとか思い込んでるから何にも理解出来ないんだよwww 思い込みじゃなくて自分できちんと日本語使って数学的な定義述べてみろよwww 出来ないんだろwww http://rio2016.5ch.net/test/read.cgi/math/1723152147/530
531: 132人目の素数さん [sage] 2025/01/10(金) 02:06:10.84 ID:5hjYx106 Fimoseくんはロータリーエンジンの動くシェーマの動画を作れないの? 完成した動画をみてもハウジングが何かわからんようだし。 やっぱり、弄れるのはforeskinだけ。 http://rio2016.5ch.net/test/read.cgi/math/1723152147/531
532: 132人目の素数さん [sage] 2025/01/10(金) 02:14:15.07 ID:H6m+2x8m 結局できなくて発狂かよ 自分で出したクソの処理すらできない模様 http://rio2016.5ch.net/test/read.cgi/math/1723152147/532
533: 132人目の素数さん [sage] 2025/01/10(金) 02:18:01.93 ID:MdFFAMIP >>531 汚い言葉で誤魔化すばっかりかよwww 他人がどうこうなんて関係なくお前が無能な事を指摘して貰ってるんだから誤魔化さずに自分で努力してみろよwww http://rio2016.5ch.net/test/read.cgi/math/1723152147/533
534: 132人目の素数さん [sage] 2025/01/10(金) 02:31:21.32 ID:H6m+2x8m 毎回毎回同じことしか言えないし知性のかけらもないのに自称医者東大卒とは笑わせるねww http://rio2016.5ch.net/test/read.cgi/math/1723152147/534
535: 132人目の素数さん [sage] 2025/01/10(金) 05:36:36.58 ID:5hjYx106 >>534 俺は医科歯科卒 理1を蹴って入学。 あんたは動画すら作れないFランなんだろ。 このスレは出禁だぞ。 http://rio2016.5ch.net/test/read.cgi/math/1723152147/535
536: 132人目の素数さん [sage] 2025/01/10(金) 07:02:22.75 ID:nzxEBzqG >>535 医科歯科卒wwww 日本語すらまともに使えない中卒以下の低脳が何言ってんの? Fラン受験出来るのが羨ましいのかよwww http://rio2016.5ch.net/test/read.cgi/math/1723152147/536
537: 132人目の素数さん [sage] 2025/01/10(金) 08:29:22.85 ID://fsJZeZ 医科歯科ってスレタイ読めなくても卒業できるの? ルールに則らないことを推奨してるの? 医師国家試験でルールに則らないことを是とする回答をしたの? http://rio2016.5ch.net/test/read.cgi/math/1723152147/537
538: 132人目の素数さん [sage] 2025/01/10(金) 08:30:21.85 ID://fsJZeZ 質問スレで出題ばかりするし質問には回答しないしで、 世の中のいなくなったほうが世界か良くなる人物の中の一人 http://rio2016.5ch.net/test/read.cgi/math/1723152147/538
539: 132人目の素数さん [sage] 2025/01/10(金) 09:16:14.22 ID:zQblG/AR >>535 まあ匿名掲示板ならいくらでも経歴盛れるもんなそんな主張意味ないよ 本当に医科歯科卒ならそれ相応の能力を示せよ http://rio2016.5ch.net/test/read.cgi/math/1723152147/539
540: 132人目の素数さん [sage] 2025/01/10(金) 11:01:30.43 ID:QR184n+C 今日は内視鏡が少なくて10:30に終了。予約の検査終了したら帰っていい契約なので( ・∀・)イイ!! http://rio2016.5ch.net/test/read.cgi/math/1723152147/540
541: 132人目の素数さん [sage] 2025/01/10(金) 11:16:40.37 ID:QR184n+C 熟練職人不足で新年から内視鏡週3回になった。 スタッフが可愛いので続けられる。 http://rio2016.5ch.net/test/read.cgi/math/1723152147/541
542: 132人目の素数さん [sage] 2025/01/10(金) 11:31:20.92 ID:zQblG/AR 本物の医者がこんな数学板の糞スレにいるわけないじゃん忙しいはずなのに妄想乙 http://rio2016.5ch.net/test/read.cgi/math/1723152147/542
543: 132人目の素数さん [sage] 2025/01/10(金) 11:56:51.07 ID:02D377cs >>540 これが何かの証拠になるとか思ってんの? 説得力皆無で今まで誰一人信じて貰ってないのが現実だろwwww 何の意味もない事繰り返し書き込んじゃうって知能低すぎん? http://rio2016.5ch.net/test/read.cgi/math/1723152147/543
メモ帳
(0/65535文字)
上
下
前
次
1-
新
書
関
写
板
覧
索
設
栞
歴
あと 448 レスあります
スレ情報
赤レス抽出
画像レス抽出
歴の未読スレ
AAサムネイル
Google検索
Wikipedia
ぬこの手
ぬこTOP
0.017s