KEMBAR78
Importing The Files | PDF | Student's T Test | Correlation And Dependence
0% found this document useful (0 votes)
76 views14 pages

Importing The Files

The document provides information on various data structures and functions in R including vectors, matrices, arrays, data frames, and lists. It also summarizes graphical parameters that can customize graphs, arithmetic and logical operators, and functions for statistics, dates, random numbers, and data manipulation including aggregating, melting, and casting data. Key R functions covered include read.csv(), matrix(), data.frame(), plot(), hist(), boxplot(), mean(), median(), and aggregate().

Uploaded by

Vijaya Banu
Copyright
© © All Rights Reserved
We take content rights seriously. If you suspect this is your content, claim it here.
Available Formats
Download as DOCX, PDF, TXT or read online on Scribd
0% found this document useful (0 votes)
76 views14 pages

Importing The Files

The document provides information on various data structures and functions in R including vectors, matrices, arrays, data frames, and lists. It also summarizes graphical parameters that can customize graphs, arithmetic and logical operators, and functions for statistics, dates, random numbers, and data manipulation including aggregating, melting, and casting data. Key R functions covered include read.csv(), matrix(), data.frame(), plot(), hist(), boxplot(), mean(), median(), and aggregate().

Uploaded by

Vijaya Banu
Copyright
© © All Rights Reserved
We take content rights seriously. If you suspect this is your content, claim it here.
Available Formats
Download as DOCX, PDF, TXT or read online on Scribd
You are on page 1/ 14

Importing the files

library(s20x)
library(car)
#read the dataset from an existing .csv file
df <- read.csv(file.choose(),header=T)

Commands and explanation


Vectors
Vectors are one-dimensional arrays that can hold numeric data, character data, or logical data.
The combine function c() is used to form the vector. Here are examples of each type of vector:
a <- c(1, 2, 5, 3, 6, -2, 4)
b <- c("one", "two", "three")
c <- c(TRUE, TRUE, TRUE, FALSE, TRUE, FALSE)

Matrices
A matrix is a two-dimensional array where each element has the same mode (numeric,character,
or logical). Matrices are created with the matrix function .
Example: >
y <- matrix(1:20, nrow=5, ncol=4)
y

Arrays
Arrays are similar to matrices but can have more than two dimensions. They’re created with an
array function of the following form:
myarray <- array(vector, dimensions, dimnames)

Data frames
A data frame is more general than a matrix in that different columns can contain different modes
of data (numeric, character, etc.).
A data frame is created with the data.frame() function :mydata <- data.frame(col1, col2, col3,…)

List
A list allows you to gather a variety of (possibly unrelated) objects under one name. For
example, a list may contain a combination of vectors, matrices, data frames, and even other lists.
You create a list using the list()
function :mylist <- list(object1, object2, …)

Data objects functions


Name Syntax Purpose
Length length(object) Number of elements/components.
Dimension dim(object) Dimensions of an object.
Structure str(object) Structure of an object.
Class class(object) Class or type of an object.
Mode mode(object) How an object is stored.
Names of components in an
Names names(object) object.
Combine c(object, object,...) Combines objects into a vector.
Column Bind cbind(object, object, ...) Combines objects as columns.
Row Bind rbind(object, object, ...) Combines objects as rows.
Object object Prints the object.
Head head(object) Lists the first part of the object.
Tail tail(object) Lists the last part of the object.
List ls() Lists current objects.
Remove rm(object, object, ...) Deletes one or more objects.
Edit Object fix(object) Edits in place.

Graphical parameters
Customize many features of a graph (fonts, colors, axes, titles) through options called graphical
parameters.
One way is to specify these options through the par() function.
format : par(optionname=value, optionname=value, ...)

Parameters for specifying symbols and lines

Paramete
r Description
pch Specifies the symbol to use when plotting points.
cex Specifies the symbol size.
lty Specifies the line type
lwd Specifies the line width.

Parameters for specifying color

Paramete
r Description
col Default plotting color.
col.axis Color for axis text.
col.lab Color for axis labels.
col.main Color for titles.
col.sub Color for subtitles.
fg The plot’s foreground color.
bg The plot’s background color.

Parameters specifying text size

Paramete
r Description
cex Magnification
cex.axis Magnification of axis text relative to cex.
cex.lab Magnification of axis labels relative to cex.
cex.main Magnification of titles relative to cex.
cex.sub Magnification of subtitles relative to cex

Parameters specifying font family, size, and style

Paramete
r Description
Integer specifying font to use for plotted text. 1=plain, 2=bold,
font 3=italic
font.axis Font for axis text.
font.lab Font for axis labels.
font.main Font for titles.
font.sub Font for subtitles.
ps Font point size

Reference lines
The abline() function is used to add reference lines to our graph.
Format : abline(h=yvalues, v=xvalues)

Legend
When more than one set of data or group is incorporated into a graph, a legend canhelp you to
identify what’s being represented by each bar, pie slice, or line.
Format : legend(location, title, legend, ...)

Command Purpose
plot( ) Produces a scatterplot
hist( ) Produces a histogram
boxplot( ) Produces a boxplot

Arithmetic operators

Operato
r Description
+ Addition
- Subtraction
* Multiplication
/ Division
x%%y Modulus
x%/%y Integer division

Logical operators

Operato
r Description
< Less than
<= Less than or equal to
> Greater than
>= Greater than or equal to
== Exactly equal to
!= Not equal to
!x Not x
x|y x or y
x&y x and y

Date formats
syntax is as.Date(x, "input_format")

Symbol Meaning Example


Day as a number (0–
%d 31) 01–31
Abbreviated
%a weekday Mon
Unabbreviated
%A weekday Monday
%m Month (00–12) 00–12
%b Abbreviated month Jan
Unabbreviated
%B month January
%y 2-digit year 07
%Y 4-digit year 2007

Paramete
Description
r
order( ) Sort
merge( ) Merge

Mathematical functions

Function Description
abs(x) Absolute value
sqrt(x) Square root
ceiling(x) Smallest integer not less than x
floor(x) Largest integer not greater than x
Integer formed by truncating values in x
trunc(x) toward 0
exp(x) Exponential function

Statistical functions

Function Description
mean(x) Mean
median(x) Median
sd(x) Standard Deviation
var(x) Variance
mad(x) Median absolute deviation
range(x) Range
sum(x) Sum
Lagged differences, with lag indicating which
diff(x, lag=n) lag to use.
min(x) Minimum
max(x) Maximum
scale(x,center=TRUE,scale=TRU
E) Column center

Paramete
r Description
runif () Random Number Generation
set.seed () To make random numbers reproducible

Multivariate normal distribution


mvrnorm() function
Function : mvrnorm(n, mean, sigma)

Character functions
Function Description
nchar(x) Counts the number of characters of x
Extract or replace substrings in a character
substr(x, start, stop ) vector.
grep(pattern, x, ignore.
case=FALSE, fixed=FALSE) Search for pattern in x.
sub(pattern, replacement, x, Find pattern in x and substitute with
ignore.case=FALSE, fixed=FALSE) replacement text.
strsplit(x, split, fixed=FALSE) Split the elements of character vector x at split.
Concatenate strings after using sep string to
paste(..., sep="") separate them.
toupper(x) Uppercase
tolower(x) Lowercase

Other functions
Function Description
length(x) Length of object x.
seq(from, to, by) Generate a sequence.
rep(x, n) Repeat x n times.
cut(x, n) Divide continuous variable x into factor with n levels.
pretty(x, n) Create pretty breakpoints.
Concatenates the objects in … and outputs them to the screen
cat(… , file ="myfile", append or to a
=FALSE) file (if one is declared) .

FOR
The for loop executes a statement repetitively until a variable’s value is no longer contained
in the sequence seq.
The syntax is for (var in seq) statement

WHILE
A while loop executes a statement repetitively until the condition is no longer true.
The syntax is while (cond) statement

IF-ELSE
The if-else control structure executes a statement if a given condition is true. Optionally,a
different statement is executed if the condition is false. The syntax is
if (cond) statement
if (cond) statement1 else statement2

SWITCH
switch chooses statements based on the value of an expression.
The syntax is switch(expr, ...)

Transpose
The transpose (reversing rows and columns) is perhaps the simplest method of reshaping a
dataset. t() function
Aggregating data
It’s relatively easy to collapse data in R using one or more by variables.
The format is aggregate(x, by, FUN)

Melting
When you melt a dataset, you restructure it into a format where each measured variable
is in its own row, along with the ID variables needed to uniquely identify it.
library(reshape)
md <- melt(mydata, id=(c("id", "time")))

Casting
The cast() function starts with melted data and reshapes it using a formula that you provide and
an (optional) function used to aggregate the data.
The format is newdata <- cast(md, formula, FUN)

Bar plots
Bar plots display the distribution (frequencies) of a categorical variable through vertical or
horizontal bars. Format of the barplot()

Simple bar plot


Example:
barplot(counts,
main="Simple Bar Plot",
xlab="Improvement", ylab="Frequency")

Horizontal bar plot


Example:
barplot(counts,
main="Horizontal Bar Plot",
xlab="Frequency", ylab="Improvement",
horiz=TRUE)

Stacked and grouped bar plots


If height is a matrix rather than a vector, the resulting graph will be a stacked or grouped bar
plot.
Stacked bar plot
Example:
barplot(counts,
main="Stacked Bar Plot",
xlab="Treatment", ylab="Frequency",
col=c("red", "yellow","green"),
legend=rownames(counts))
Grouped bar plot
Example:
barplot(counts,
main="Grouped Bar Plot",
xlab="Treatment", ylab="Frequency",
col=c("red", "yellow", "green"),
legend=rownames(counts), beside=TRUE)

Mean bar plots


Bar plots needn’t be based on counts or frequencies. You can create bar plots that represent
means, medians, standard deviations, and so forth by using the aggregate function and passing
the results to the barplot() function.

Example:barplot(means$x, names.arg=means$Group.1)

Tweaking bar plots


There are several ways to tweak the appearance of a bar plot. For example, with many bars, bar
labels may start to overlap.
Example:
barplot(counts,
main="Treatment Outcome",
horiz=TRUE, cex.names=0.8,
names.arg=c("No Improvement", "Some Improvement",
"Marked Improvement"))

Spinograms
Spinogram, a stacked bar plot is rescaled so that the height of each bar is 1 and the segment
heights represent proportions. Spinograms are created through the spine()function.

Pie Charts
Pie charts are created with the function pie(x, labels)
par(mfrow=c(2, 2))
slices <- c(10, 12,4, 16, 8)
lbls <- c("US", "UK", "Australia", "Germany", "France")

Simple Pie Chart


Example:
pie( slices, labels = lbls,
main="Simple Pie Chart")
3D Pie Chart
Example:
library(plotrix)
pie3D(slices, labels=lbls,explode=0.1,
main="3D Pie Chart ")
Pie Chart with percentages
Example:
pct <- round(slices/sum(slices)*100)
lbls2 <- paste(lbls, " ", pct, "%", sep="")
pie(slices, labels=lbls2, col=rainbow(length(lbls2)),
main="Pie Chart with Percentages")
Pie Chart from Table
Example:
mytable <- table(state.region)
lbls3 <- paste(names(mytable), "\n", mytable, sep="")
pie(mytable, labels = lbls3,
main="Pie Chart from a Table\n (with sample sizes)")

Fan Plot
Fan plot provides the user with a way to display both relative quantities and differences.
fan.plot()
Example:
library(plotrix)
slices <- c(10, 12,4, 16, 8)
lbls <- c("US", "UK", "Australia", "Germany", "France")
fan.plot(slices, labels = lbls, main="Fan Plot")

Histograms
Histograms display the distribution of a continuous variable by dividing up the range of scores
into a specified number of bins on the x-axis and displaying the frequency of scores in each bin
on the y-axis.
Function: hist(x)
Histogram, rug plot, density curve
Example:
hist(mtcars$mpg,
freq=FALSE,
breaks=12,
col="red",
xlab="Miles Per Gallon",
main="Histogram, rug plot, density curve")
rug(jitter(mtcars$mpg))
lines(density(mtcars$mpg), col="blue", lwd=2)

Kernel density plots


Kernel density plots can be an effective way to view the distribution of a continuous variable.
plot(density(x))

Box plots
Box plots can be created for individual variables or for variables by group.
boxplot(formula, data=dataframe)
Violin plot
Violin plot is a combination of a box plot and a kernel density plot.
vioplot(x1, x2, … , names=, col=)

Dot plot
Dot plots provide a method of plotting a large number of labeled values on a simple horizontal
scale. dotchart()
Format : dotchart(x, labels=)

Descriptive statistics
Summary & Sapply
The summary() function provides the minimum, maximum, quartiles, and the mean for
numerical variables and frequencies for factors and logical vectors.
sapply()
Format :sapply(x, FUN, options)

Descriptive statistics via describe() in the Hmisc package()


The describe()function in the Hmisc package returns the number of variables and observations,
the number of missing and unique values, the mean, quantiles, and the five highest and lowest
values.
Example:
library(Hmisc)
describe(mtcars[vars])
Descriptive statistics via stat.desc in the pastecs package()
The pastecs package includes a function named stat.desc() that provides a wide
range of descriptive statistics.
Format stat.desc(x, basic=TRUE, desc=TRUE, norm=FALSE, p=0.95)
Example:
library(pastecs)
stat.desc(mtcars[vars])

Descriptive statistics via describe() in the psych package()


The psych package also has a function called describe() that provides the number of nonmissing
observations, mean, standard deviation, median,trimmed mean, median absolute deviation,
minimum, maximum, range, skew, kurtosis,and standard error of the mean.
Example:
library(psych)
describe(mtcars[vars])

Descriptive statistics by group using aggregate()


Example:
aggregate(mtcars[vars], by=list(am=mtcars$am), mean)

Descriptive statistics by group using by()


In aggregate() only allows you to use single value functions such as mean, standard deviation,
and the like in each call. It won’t return several statistics at once. For that task, you can use the
by()function. The format is
by(data, INDICES, FUN)

Example:.7 Descriptive statistics by group using by()


dstats <- function(x)(c(mean=mean(x), sd=sd(x)))
by(mtcars[vars], mtcars$am, dstats)

Extensions
The doBy package and the psych package also provide functions for descriptive statistics by
group. Again, they aren’t distributed in the base installation and must be installed before first
use. The summaryBy() function in the doBy package has the
format summaryBy(formula, data=dataframe, FUN=function)

Summary statistics by group using summaryBy()in the doBy package


Example:
library(doBy)
summaryBy(mpg+hp+wt~am, data=mtcars, FUN=mystats)

Summary statistics by group using describe.by()in the psych package


Example:
library(psych)
describe.by(mtcars[vars], mtcars$am)

Summary statistics by group via the reshape package


Example:
library(reshape)
dstats <- function(x)(c(n=length(x), mean=mean(x), sd=sd(x)))
dfm <- melt(mtcars, measure.vars=c("mpg", "hp", "wt"),
id.vars=c("am", "cyl"))
cast(dfm, am + cyl + variable ~ ., dstats)

Function Description
table(var1, var2, …, varN) Creates an N-way contingency table from N categorical variables (factors)
Creates an N-way contingency table based on a formula and a matrix or
xtabs(formula, data) data frame
Expresses table entries as fractions of the marginal table defined by the
prop.table(table, margins) margins
Computes the sum of table entries for a marginal
margin.table(table, margins) table defined by the margins
addmargins(table, margins) Puts summary margins (sums by default) on a table
ftable(table) Creates a compact "flat" contingency table
Two-way table using CrossTable
Example:
library(gmodels)
CrossTable(Arthritis$Treatment, Arthritis$Improved)

Chi-Square Test Of Independence


The function chisq.test() to a two-way table in order to produce a chi-square test of independence
of the row and column variables.
Example:
library(vcd)
mytable <- xtabs(~Treatment+Improved, data=Arthritis)
chisq.test(mytable)

Fisher’s exact test


Fisher’s exact test evaluates the null hypothesis of independence of rows and columns in a
contingencytable with fixed marginals. The format is fisher.test(mytable), where mytable is a
two-way table.
Example:
mytable <- xtabs(~Treatment+Improved, data=Arthritis)
fisher.test(mytable)

Cochran–Mantel–Haenszel Test
The mantelhaen.test() function provides a Cochran–Mantel–Haenszel chi-square test of the null
hypothesis that two nominal variables are conditionally independent in each stratum of a third
variable
Example:
mytable <- xtabs(~Treatment+Improved+Sex, data=Arthritis)
mantelhaen.test(mytable)

Measures of association
The assocstats() function in the vcd package can be used to calculate the phi coefficient,
contingency coefficient,and Cramer’s V for a two-way table.
Example:
library(vcd)
mytable <- xtabs(~Treatment+Improved, data=Arthritis)
assocstats(mytable)

Correlations
Correlation coefficients are used to describe relationships among quantitative variables.The sign
± indicates the direction of the relationship (positive or inverse) and the magnitude indicates the
strength of the relationship.
The cor() function produces all three correlation coefficients, whereas the cov()function provides
covariances. There are many options, but a simplified format for producing correlations is
cor(x, use= , method= )

Partial Correlations
The pcor() function in the ggm package to provide partial correlation coefficients. The ggm
package isn’t installed by default, so be sure to install it on first use. The format is pcor(u, S)

Testing correlations for significance


The cor.test() function to test an individual Pearson, Spearman, and Kendall correlation
coefficient. A simplified format is cor.test(x, y, alternative = , method = )

Other Tests Of Significance


The pcor.test() function in the psych package can be used to test the conditional independence of
two variables controlling for one or more additional variables, assuming multivariate normality.
The format is pcor.test(r, q, n)

T-tests
Independent t-test
The two groups are independent and that the data are sampled from normal populations.
The format is either
t.test(y ~ x, data)
t.test(y1, y2)

Dependent t-test
A dependent t-test assumes that the difference between groups is normally distributed. In this
case, the format is
t.test(y1, y2, paired=TRUE)

Comparing two groups


If the two groups are independent, you can use the Wilcoxon rank sum test (more popularly
known as the Mann–Whitney U test) to assess whether the observations are sampled from the
same probability distribution.The format is
either
wilcox.test(y ~ x, data)
wilcox.test(y1, y2)

Comparing more than two groups


If the groups are dependent (for example, repeated measures or randomized block design), the
Friedman test is moreappropriate.
Format :kruskal.test(y ~ A, data)
Format :friedman.test(y ~ A | B, data)

Packages
Used
library(Hmisc)
library(RODB
C)
library(foreign
)
library(ncdf)
library(reshap
e)
library(sqldf)
library(MASS
)
library(vcd)
library(plotrix)
library(vioplot
)
library(pastecs
)
library(doBy)
library(psych)
library(vcd)
library(ggm)

You might also like