চিত্ৰ:Correlation examples2.svg

এই পৃষ্ঠাৰ সমল অন্য ভাষাত সমৰ্থিত নহয়।
অসমীয়া ৱিকিপিডিয়াৰ পৰা

মূল ফাইল(SVG ফাইল, সাধাৰণতঃ 506 × 231 পিক্সেল, ফাইল মাত্ৰা: 2.18 MB)

এই ফাইলটো ৱিকিমিডিয়া কমন্সৰ পৰা আমদানি কৰা হৈছে। ফাইল বিৱৰণ পৃষ্ঠাৰ সবিশেষ তথ্য তলত উল্লেখ কৰা হ’ল ।
ৱিকিমিডিয়া কমন্স এটা মুক্ত অনুজ্ঞাপত্ৰ মিডিয়াৰ ভঁৰাল। আপুনিও ইচ্ছা কৰিলে এই প্ৰকল্পত সহায় কৰিব পাৰে

সাৰাংশ

বিৱৰণ
English: redesign File:Correlation_examples.png using vector graphics (SVG file)
তাৰিখ
উৎস নিজা কাৰ্য, original uploader was Imagecreator
লেখক DenisBoigelot, original uploader was Imagecreator
অনুমতি
(এই ফাইলৰ পুনঃব্যৱহাৰ)
Released into the public domain (by the authors).
অন্যান্য সংস্কৰণ

Derivative works of this file:  CovrarianceCorrelation.svg

File:Correlation_examples.png
#Title: An example of the correlation of x and y for various distributions of (x,y) pairs
#Tags: Mathematics; Statistics; Correlation
#Author: Denis Boigelot
#Packets needed : mvtnorm (rmvnorm), RSVGTipsDevice (devSVGTips)
#How to use: output()
#
#This is an translated version in R of an Matematica 6 code by Imagecreator.

library(mvtnorm)
library(RSVGTipsDevice)

MyPlot <- function(xy, xlim = c(-4, 4), ylim = c(-4, 4), eps = 1e-15) {
   title = round(cor(xy[,1], xy[,2]), 1)
   if (sd(xy[,2]) < eps) title = "" # corr. coeff. is undefined
   plot(xy, main = title, xlab = "", ylab = "",
        col = "darkblue", pch = 16, cex = 0.2,
        xaxt = "n", yaxt = "n", bty = "n",
        xlim = xlim, ylim = ylim)
}

MvNormal <- function(n = 1000, cor = 0.8) {
   for (i in cor) {
      sd = matrix(c(1, i, i, 1), ncol = 2)
      x = rmvnorm(n, c(0, 0), sd)
      MyPlot(x)
   }
}

rotation <- function(t, X) return(X %*% matrix(c(cos(t), sin(t), -sin(t), cos(t)), ncol = 2))

RotNormal <- function(n = 1000, t = pi/2) {
   sd = matrix(c(1, 1, 1, 1), ncol = 2)
   x = rmvnorm(n, c(0, 0), sd)
   for (i in t)
      MyPlot(rotation(i, x))
}

Others <- function(n = 1000) {
   x = runif(n, -1, 1)
   y = 4 * (x^2 - 1/2)^2 + runif(n, -1, 1)/3
   MyPlot(cbind(x,y), xlim = c(-1, 1), ylim = c(-1/3, 1+1/3))

   y = runif(n, -1, 1)
   xy = rotation(-pi/8, cbind(x,y))
   lim = sqrt(2+sqrt(2)) / sqrt(2)
   MyPlot(xy, xlim = c(-lim, lim), ylim = c(-lim, lim))

   xy = rotation(-pi/8, xy)
   MyPlot(xy, xlim = c(-sqrt(2), sqrt(2)), ylim = c(-sqrt(2), sqrt(2)))
   
   y = 2*x^2 + runif(n, -1, 1)
   MyPlot(cbind(x,y), xlim = c(-1, 1), ylim = c(-1, 3))

   y = (x^2 + runif(n, 0, 1/2)) * sample(seq(-1, 1, 2), n, replace = TRUE)
   MyPlot(cbind(x,y), xlim = c(-1.5, 1.5), ylim = c(-1.5, 1.5))

   y = cos(x*pi) + rnorm(n, 0, 1/8)
   x = sin(x*pi) + rnorm(n, 0, 1/8)
   MyPlot(cbind(x,y), xlim = c(-1.5, 1.5), ylim = c(-1.5, 1.5))

   xy1 = rmvnorm(n/4, c( 3,  3))
   xy2 = rmvnorm(n/4, c(-3,  3))
   xy3 = rmvnorm(n/4, c(-3, -3))
   xy4 = rmvnorm(n/4, c( 3, -3))
   MyPlot(rbind(xy1, xy2, xy3, xy4), xlim = c(-3-4, 3+4), ylim = c(-3-4, 3+4))
}

output <- function() {
   devSVGTips(width = 7, height = 3.2) # remove first and last line for no svg exporting
   par(mfrow = c(3, 7), oma = c(0,0,0,0), mar=c(2,2,2,0))
   MvNormal(800, c(1.0, 0.8, 0.4, 0.0, -0.4, -0.8, -1.0));
   RotNormal(200, c(0, pi/12, pi/6, pi/4, pi/2-pi/6, pi/2-pi/12, pi/2));
   Others(800)
   dev.off() # remove first and last line for no svg exporting
}

অনুজ্ঞাপত্ৰ

ম‍ই, এই কামৰ স্বত্বাধিকাৰী, ইয়াৰ দ্বাৰা ম‍ই এই কামক তলত বৰ্ননা দিয়া অনুজ্ঞাপত্ৰৰ অধীনত প্ৰকাশ কৰিলো:
Creative Commons CC-Zero This file is made available under the Creative Commons CC0 1.0 Universal Public Domain Dedication.
The person who associated a work with this deed has dedicated the work to the public domain by waiving all of their rights to the work worldwide under copyright law, including all related and neighboring rights, to the extent allowed by law. You can copy, modify, distribute and perform the work, even for commercial purposes, all without asking permission.

কেপ্‌চন

এই ফাইলে কি প্ৰতিনিধিত্ব কৰে তাৰ এটা শাৰীত ব্যাখ্যা কৰক
OVRHEAD AN D REVENUE

Items portrayed in this file

depicts ইংৰাজী

ৱিকিতথ্য আইটেম অবিহনে যিকোনো মান

copyright license ইংৰাজী

Creative Commons CC0 License ইংৰাজী

inception ইংৰাজী

৯ মে' 2011

source of file ইংৰাজী

original creation by uploader ইংৰাজী

media type ইংৰাজী

image/svg+xml

checksum ইংৰাজী

31cfb22bd2b6ebd79849d3d8a0f44e93c16c64af

determination method ইংৰাজী: SHA-1 ইংৰাজী

data size ইংৰাজী

২২,৮৫,৭৭১ বাইট

height ইংৰাজী

২৩১ pixel

width ইংৰাজী

৫০৬ pixel

ফাইলৰ ইতিবৃত্ত

ফাইলৰ আগৰ অৱস্থা চাবলৈ সেই তাৰিখ/সময়ত ক্লিক কৰক।

তাৰিখ/সময়ক্ষুদ্ৰ প্ৰতিকৃতিআকাৰসদস্যমন্তব্য
বৰ্তমান06:00, 10 May 201106:00, 10 May 2011ৰ সংস্কৰণৰ ক্ষুদ্ৰ প্ৰতিকৃতি506 × 231 (2.18 MB)DenisBoigelot{{Information |Description ={{en|1=fd}} |Source ={{own}} |Author =DenisBoigelot |Date = |Permission = |other_versions = }} fjdk

তলত দিয়া পৃষ্ঠাটোৱে এই ফাইলটো ব্যৱহাৰ কৰে:

ফাইলৰ গোলকীয় ব্যৱহাৰ

তলত দিয়া আন ৱিকিসমূহে এই ফাইলটো ব্যৱহাৰ কৰে:

মেটাডেটা