# Load necessary libraries
library(dplyr)
## 
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union
library(ggplot2)
library(scales) # for date formatting
library(corrplot)
## corrplot 0.92 loaded
library(zoo)
## 
## Attaching package: 'zoo'
## The following objects are masked from 'package:base':
## 
##     as.Date, as.Date.numeric
# Define the column names for the columns you are interested in
column_names <- c('Date', 'Time', 'Open', 'High', 'Low', 'Close', 'Extra1', 'Extra2')
# Read the CSV files into data frames with the correct delimiter and without headers
data_es <- read.csv('es-1m.csv', stringsAsFactors = FALSE, sep = ";", header = FALSE, col.names = column_names)
data_ny <- read.csv('ny-1m.csv', stringsAsFactors = FALSE, sep = ";", header = FALSE, col.names = column_names)
# Combine Date and Time columns into a single DateTime column for each dataset
data_es$DateTime <- as.POSIXct(paste(data_es$Date, data_es$Time), format="%d/%m/%Y %H:%M:%S")
data_ny$DateTime <- as.POSIXct(paste(data_ny$Date, data_ny$Time), format="%d/%m/%Y %H:%M:%S")
# Drop the original Date and Time columns
data_es <- data_es[, -c(1,2)]
data_ny <- data_ny[, -c(1,2)]
# Merge the datasets on the 'DateTime' column with custom suffixes
merged_data <- merge(data_es, data_ny, by = "DateTime", suffixes = c(".SP500", ".Nikkei"))
# Calculate the correlation between the 'Close' prices
correlation_coefficient <- cor(merged_data$Close.SP500, merged_data$Close.Nikkei, use = "complete.obs")
# Print the correlation coefficient
print(correlation_coefficient)
## [1] 0.9657207
# Normalize the data
merged_data$Close.SP500.norm <- merged_data$Close.SP500 / merged_data$Close.SP500[1] * 100
merged_data$Close.Nikkei.norm <- merged_data$Close.Nikkei / merged_data$Close.Nikkei[1] * 100
# Create a normalized plot
ggplot() +
  geom_line(data = merged_data, aes(x = DateTime, y = Close.SP500.norm, colour = "SP500")) +
  geom_line(data = merged_data, aes(x = DateTime, y = Close.Nikkei.norm, colour = "Nikkei")) +
  scale_colour_manual(values = c("SP500" = "blue", "Nikkei" = "red")) +
  theme_minimal() +
  labs(title = "Normalized Time Series of SP500 and Nikkei Close Prices",
       x = "Date",
       y = "Indexed Close Price",
       colour = "Index") +
  scale_x_datetime(date_breaks = "2 years", date_labels = "%Y") # Adjust date breaks as needed

# Assuming you have already calculated the correlation coefficient
correlation_matrix <- cor(merged_data[, c("Close.SP500", "Close.Nikkei")], use = "complete.obs")

# Create a correlogram
corrplot(correlation_matrix, method = "circle", type = "upper", tl.col = "black", tl.srt = 45)

# Make sure the columns are numeric
merged_data$Close.SP500 <- as.numeric(merged_data$Close.SP500)
merged_data$Close.Nikkei <- as.numeric(merged_data$Close.Nikkei)

# Calculate rolling correlation with a suitable window size, e.g., 30 days
# Make sure to start the rollapply from the 30th row to avoid NA values
rolling_cor <- rollapply(data = merged_data[30:nrow(merged_data), c("Close.SP500", "Close.Nikkei")], width = 30,
                         FUN = function(x) cor(x[, 1], x[, 2], use = "complete.obs"),
                         by.column = FALSE, align = 'right')
## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero

## Warning in cor(x[, 1], x[, 2], use = "complete.obs"): the standard deviation is
## zero
# Add the rolling correlation as a new column to the merged_data, starting from the 30th row
merged_data$RollingCor <- NA  # Initialize the column with NAs
merged_data$RollingCor[30:nrow(merged_data)] <- rolling_cor  # Fill in the actual rolling correlation values
## Warning in merged_data$RollingCor[30:nrow(merged_data)] <- rolling_cor: number
## of items to replace is not a multiple of replacement length
# Plot rolling correlation
ggplot(data.frame(Date = merged_data$DateTime, RollingCor = merged_data$RollingCor), aes(x = Date, y = RollingCor)) +
  geom_line(na.rm = TRUE) +  # na.rm = TRUE to remove NA values from the plot
  theme_minimal() +
  labs(title = "30-Day Rolling Correlation between SP500 and Nikkei Close Prices",
       x = "Date",
       y = "Rolling Correlation")

# Remove rows with NA values in 'Close.SP500' and 'Close.Nikkei' before calculating cumulative returns
merged_data <- merged_data[!is.na(merged_data$Close.SP500) & !is.na(merged_data$Close.Nikkei), ]

# Calculate cumulative returns, skipping the first row to avoid NA from lag
merged_data <- merged_data %>%
  mutate(
    CumulativeReturn.SP500 = cumsum(log(Close.SP500 / lag(Close.SP500, default = Close.SP500[1]))),
    CumulativeReturn.Nikkei = cumsum(log(Close.Nikkei / lag(Close.Nikkei, default = Close.Nikkei[1])))
  )

# Plot cumulative returns
ggplot(merged_data, aes(x = DateTime)) +
  geom_line(aes(y = CumulativeReturn.SP500, colour = "SP500")) +
  geom_line(aes(y = CumulativeReturn.Nikkei, colour = "Nikkei")) +
  scale_colour_manual(values = c("SP500" = "blue", "Nikkei" = "red")) +
  theme_minimal() +
  labs(title = "Cumulative Returns of SP500 and Nikkei",
       x = "Date",
       y = "Cumulative Returns",
       colour = "Index")