मेरे पास एक डेटा फ्रेम है जिसमें कॉलम ए, बी और सी हैं। मैं b और c के बीच एक नया कॉलम d जोड़ना चाहूंगा।
मुझे पता है कि मैं सिर्फ cbind का उपयोग करके अंत में d जोड़ सकता हूं लेकिन मैं इसे दो स्तंभों के बीच कैसे सम्मिलित कर सकता हूं ?
मेरे पास एक डेटा फ्रेम है जिसमें कॉलम ए, बी और सी हैं। मैं b और c के बीच एक नया कॉलम d जोड़ना चाहूंगा।
मुझे पता है कि मैं सिर्फ cbind का उपयोग करके अंत में d जोड़ सकता हूं लेकिन मैं इसे दो स्तंभों के बीच कैसे सम्मिलित कर सकता हूं ?
जवाबों:
मैं आपको पैकेज add_column()
से फ़ंक्शन का उपयोग करने का सुझाव tibble
दूंगा।
library(tibble)
dataset <- data.frame(a = 1:5, b = 2:6, c=3:7)
add_column(dataset, d = 4:8, .after = 2)
ध्यान दें कि आप कॉलम नामों का उपयोग कॉलम इंडेक्स के बजाय कर सकते हैं:
add_column(dataset, d = 4:8, .after = "b")
या तर्क का उपयोग करें यदि .before
इसके बजाय .after
अधिक सुविधाजनक।
add_column(dataset, d = 4:8, .before = "c")
अपने नए कॉलम में जोड़ें:
df$d <- list/data
तब आप उन्हें पुनः व्यवस्थित कर सकते हैं।
df <- df[, c("a", "b", "d", "c")]
setcolorder
स्तंभ संख्याओं के साथ संयोजन के रूप में उपयोग करना पुनः व्यवस्थित लगता है (जैसा कि उनके नामों के विपरीत) यह भी बहुत उपयोगी है, क्योंकि एक बार स्तंभों की संख्या बहुत बड़ी हो जाने के बाद, आप अधिकांश कार्य करना seq
और उपयोग rep
करना शुरू कर सकते हैं। प्लस अंकगणितीय ऑपरेटरों का उपयोग किया जा सकता है। जैसेsetcolorder(data, c(1, (num_cols -2), (num_cols -1), num_cols, seq(from = 2, to = (num_cols - 3))))
setcolorder
एक data.table के लिए है, एक data.frame नहीं है!
आप स्तंभों को [, या इच्छित क्रम में कॉलम प्रस्तुत कर सकते हैं।
d <- data.frame(a=1:4, b=5:8, c=9:12)
target <- which(names(d) == 'b')[1]
cbind(d[,1:target,drop=F], data.frame(d=12:15), d[,(target+1):length(d),drop=F])
a b d c
1 1 5 12 9
2 2 6 13 10
3 3 7 14 11
4 4 8 15 12
यह मानते हुए कि c
हमेशा तुरंत अनुसरण करता है b
, यह कोड आपके डेटा में b
किसी भी मामले के बाद कोई कॉलम नहीं b
जोड़ेगा।
> test <- data.frame(a=1,b=1,c=1)
> test
a b c
1 1 1 1
> bspot <- which(names(test)=="b")
> data.frame(test[1:bspot],d=2,test[(bspot+1):ncol(test)])
a b d c
1 1 1 2 1
या संभवतः अधिक स्वाभाविक रूप से:
data.frame(append(test, list(d=2), after=match("b", names(test))))
एक उदाहरण data.frame बनाएँ और इसमें एक कॉलम जोड़ें।
df = data.frame(a = seq(1, 3), b = seq(4,6), c = seq(7,9))
df['d'] <- seq(10,12)
df
a b c d
1 1 4 7 10
2 2 5 8 11
3 3 6 9 12
कॉलम इंडेक्स द्वारा पुनर्व्यवस्थित करें
df[, colnames(df)[c(1:2,4,3)]]
या कॉलम नाम से
df[, c('a', 'b', 'd', 'c')]
परिणाम है
a b d c
1 1 4 10 7
2 2 5 11 8
3 3 6 12 9
आप कॉलम x और y द्वारा परिभाषित पुराने डेटा फ्रेम (old.df) पर कॉलम z जोड़ना चाहेंगे।
z = rbinom(1000, 5, 0.25)
old.df <- data.frame(x = c(1:1000), y = rnorm(1:1000))
head(old.df)
नया डेटा फ़्रेम परिभाषित करें जिसे new.df कहा जाता है
new.df <- data.frame(x = old.df[,1], z, y = old.df[,2])
head(new.df)
यहां डेटा फ्रेम पर एक विशिष्ट स्थिति में एक कॉलम डालने का एक त्वरित और गंदा तरीका है। मेरे मामले में, मेरे पास मूल डेटा फ़्रेम में 5 कॉलम हैं: c1, c2, c3, c4, c5
और मैं और के c2b
बीच एक नया कॉलम सम्मिलित करूँगा ।c2
c3
1) आइये सबसे पहले टेस्ट डाटा फ्रेम बनाते हैं:
> dataset <- data.frame(c1 = 1:5, c2 = 2:6, c3=3:7, c4=4:8, c5=5:9)
> dataset
c1 c2 c3 c4 c5
1 1 2 3 4 5
2 2 3 4 5 6
3 3 4 5 6 7
4 4 5 6 7 8
5 5 6 7 8 9
2) c2b
हमारे डेटा फ्रेम के अंत में नया कॉलम जोड़ें :
> dataset$c2b <- 10:14
> dataset
c1 c2 c3 c4 c5 c2b
1 1 2 3 4 5 10
2 2 3 4 5 6 11
3 3 4 5 6 7 12
4 4 5 6 7 8 13
5 5 6 7 8 9 14
3) कॉलम इंडेक्स के आधार पर डेटा फ्रेम को फिर से व्यवस्थित करें। मेरे मामले में, मैं मौजूदा कॉलम 2 और 3 के बीच नया कॉलम (6) सम्मिलित करना चाहता हूं। मैं वेक्टर के उपयोग से अपने डेटा फ्रेम पर कॉलम को संबोधित कर रहा हूं c(1:2, 6, 3:5)
जो इसके बराबर है c(1, 2, 6, 3, 4, 5)
।
> dataset <- dataset[,c(1:2, 6, 3:5)]
> dataset
c1 c2 c2b c3 c4 c5
1 1 2 10 3 4 5
2 2 3 11 4 5 6
3 3 4 12 5 6 7
4 4 5 13 6 7 8
5 5 6 14 7 8 9
वहाँ!
इसके लायक क्या है, मैंने ऐसा करने के लिए एक फ़ंक्शन लिखा:
[हटा दिया]
मैं अब के साथ इस समारोह को अद्यतन किया है before
और after
कार्यक्षमता और दोषी place
1. करने के लिए यह भी डेटा तालिका संगतता है:
#####
# FUNCTION: InsertDFCol(colName, colData, data, place = 1, before, after)
# DESCRIPTION: Takes in a data, a vector of data, a name for that vector and a place to insert this vector into
# the data frame as a new column. If you put place = 3, the new column will be in the 3rd position and push the current
# 3rd column up one (and each subsuquent column up one). All arguments must be set. Adding a before and after
# argument that will allow the user to say where to add the new column, before or after a particular column.
# Please note that if before or after is input, it WILL override the place argument if place is given as well. Also, place
# defaults to adding the new column to the front.
#####
InsertDFCol <- function(colName, colData, data, place = 1, before, after) {
# A check on the place argument.
if (length(names(data)) < place) stop("The place argument exceeds the number of columns in the data for the InsertDFCol function. Please check your place number")
if (place <= 0 & (!missing(before) | !(missing(after)))) stop("You cannot put a column into the 0th or less than 0th position. Check your place argument.")
if (place %% 1 != 0 & (!missing(before) | !(missing(after)))) stop("Your place value was not an integer.")
if (!(missing(before)) & !missing(after)) stop("You cannot designate a before AND an after argument in the same function call. Please use only one or the other.")
# Data Table compatability.
dClass <- class(data)
data <- as.data.frame(data)
# Creating booleans to define whether before or after is given.
useBefore <- !missing(before)
useAfter <- !missing(after)
# If either of these are true, then we are using the before or after argument, run the following code.
if (useBefore | useAfter) {
# Checking the before/after argument if given. Also adding regular expressions.
if (useBefore) { CheckChoice(before, names(data)) ; before <- paste0("^", before, "$") }
if (useAfter) { CheckChoice(after, names(data)) ; after <- paste0("^", after, "$") }
# If before or after is given, replace "place" with the appropriate number.
if (useBefore) { newPlace <- grep(before, names(data)) ; if (length(newPlace) > 1) { stop("Your before argument matched with more than one column name. Do you have duplicate column names?!") }}
if (useAfter) { newPlace <- grep(after, names(data)) ; if (length(newPlace) > 1) { stop("Your after argument matched with more than one column name. Do you have duplicate column names?!") }}
if (useBefore) place <- newPlace # Overriding place.
if (useAfter) place <- newPlace + 1 # Overriding place.
}
# Making the new column.
data[, colName] <- colData
# Finding out how to reorder this.
# The if statement handles the case where place = 1.
currentPlace <- length(names(data)) # Getting the place of our data (which should have been just added at the end).
if (place == 1) {
colOrder <- c(currentPlace, 1:(currentPlace - 1))
} else if (place == currentPlace) { # If the place to add the new data was just at the end of the data. Which is stupid...but we'll add support anyway.
colOrder <- 1:currentPlace
} else { # Every other case.
firstHalf <- 1:(place - 1) # Finding the first half on columns that come before the insertion.
secondHalf <- place:(currentPlace - 1) # Getting the second half, which comes after the insertion.
colOrder <- c(firstHalf, currentPlace, secondHalf) # Putting that order together.
}
# Reordering the data.
data <- subset(data, select = colOrder)
# Data Table compatability.
if (dClass[1] == "data.table") data <- as.data.table(data)
# Returning.
return(data)
}
मुझे एहसास हुआ कि मैंने चेकचॉव को भी शामिल नहीं किया है:
#####
# FUNCTION: CheckChoice(names, dataNames, firstWord == "Oops" message = TRUE)
# DESCRIPTION: Takes the column names of a data frame and checks to make sure whatever "choice" you made (be it
# your choice of dummies or your choice of chops) is actually in the data frame columns. Makes troubleshooting easier.
# This function is also important in prechecking names to make sure the formula ends up being right. Use it after
# adding in new data to check the "choose" options. Set firstWord to the first word you want said before an exclamation point.
# The warn argument (previously message) can be set to TRUE if you only want to
#####
CheckChoice <- function(names, dataNames, firstWord = "Oops", warn = FALSE) {
for (name in names) {
if (warn == TRUE) { if(!(name %in% dataNames)) { warning(paste0(firstWord, "! The column/value/argument, ", name, ", was not valid OR not in your data! Check your input! This is a warning message of that!")) } }
if (warn == FALSE) { if(!(name %in% dataNames)) { stop(paste0(firstWord, "! The column/value/argument, " , name, ", was not valid OR not in your data! Check your input!")) } }
}
}
आसान समाधान। 5 कॉलम वाले डेटा फ़्रेम में, यदि आप 3 और 4 के बीच एक और कॉलम सम्मिलित करना चाहते हैं ...
tmp <- data[, 1:3]
tmp$example <- NA # or any value.
data <- cbind(tmp, data[, 4:5]
यह फ़ंक्शन डेटा फ़्रेम में सभी पूर्व-विद्यमान स्तंभों के बीच एक शून्य स्तंभ सम्मिलित करता है।
insertaCols<-function(dad){
nueva<-as.data.frame(matrix(rep(0,nrow(daf)*ncol(daf)*2 ),ncol=ncol(daf)*2))
for(k in 1:ncol(daf)){
nueva[,(k*2)-1]=daf[,k]
colnames(nueva)[(k*2)-1]=colnames(daf)[k]
}
return(nueva)
}
आप append()
फ़ंक्शन को वैक्टर या सूचियों में आइटम सम्मिलित करने के लिए उपयोग कर सकते हैं (डेटाफ्रेम सूची हैं)। सीधे शब्दों में:
df <- data.frame(a=c(1,2), b=c(3,4), c=c(5,6))
df <- as.data.frame(append(df, list(d=df$b+df$c), after=2))
या, यदि आप नाम उपयोग द्वारा स्थिति निर्दिष्ट करना चाहते हैं which
:
df <- as.data.frame(append(df, list(d=df$b+df$c), after=which(names(df)=="b")))
`
data1 <- data.frame(col1=1:4, col2=5:8, col3=9:12)
row.names(data1) <- c("row1","row2","row3","row4")
data1
data2 <- data.frame(col1=21:24, col2=25:28, col3=29:32)
row.names(data2) <- c("row1","row2","row3","row4")
data2
insertPosition = 2
leftBlock <- unlist(data1[,1:(insertPosition-1)])
insertBlock <- unlist(data2[,1:length(data2[1,])])
rightBlock <- unlist(data1[,insertPosition:length(data1[1,])])
newData <- matrix(c(leftBlock, insertBlock, rightBlock), nrow=length(data1[,1]), byrow=FALSE)
newData
`
जहां नया कॉलम जोड़ा गया है, उसे निर्दिष्ट करने के लिए R में कोई कार्यक्षमता नहीं है। जैसे mtcars$mycol<-'foo'
,। इसे हमेशा अंतिम कॉलम के रूप में जोड़ा जाता है। अन्य साधनों (जैसे, dplyr's select()
) का उपयोग करके आप mycol को एक वांछित स्थिति में ले जा सकते हैं। यह आदर्श नहीं है और आर भविष्य में इसे बदलने की कोशिश करना चाहते हैं।
append
कार्य है।
आप इसे नीचे की तरह कर सकते हैं -
df <- data.frame(a=1:4, b=5:8, c=9:12)
df['d'] <- seq(10,13)
df <- df[,c('a','b','d','c')]
df <- data.frame(a=c(1,2), b=c(3,4), c=c(5,6))
df %>%
mutate(d= a/2) %>%
select(a, b, d, c)
परिणाम
a b d c
1 1 3 0.5 5
2 2 4 1.0 6
मैं dplyr::select
बाद में उपयोग करने का सुझाव देता हूं dplyr::mutate
। स्तंभों के उप-चयन का चयन करने के लिए कई सहायक हैं।
इस प्रश्न के संदर्भ में आप जिस क्रम का चयन करते हैं वह आउटपुट डेटा.फ्रेम में परिलक्षित होगा।
जब आप कल्पना नहीं कर सकते कि स्तंभ b
से पहले आता है c
आप उपयोग कर सकते हैं match
, दोनों की स्तंभ संख्या को खोजने के लिए min
कम स्तंभ संख्या प्राप्त करने के लिए और seq_len
इस स्तंभ तक एक दृश्य प्राप्त करने के लिए। फिर आप इस इंडेक्स को पहले एक पॉजिटिव सब्मिट के रूप में इस्तेमाल कर सकते हैं , नए कॉलम को रखने के लिए d
और फिर एक सीक्वेंस को नेगेटिव सब्मिट की तरह इस्तेमाल कर सकते हैं।
i <- seq_len(min(match(c("b", "c"), colnames(x))))
data.frame(x[i], d, x[-i])
#cbind(x[i], d, x[-i]) #Alternative
# a b d c
#1 1 4 10 7
#2 2 5 11 8
#3 3 6 12 9
मामले में आप जानते हैं कि स्तंभ b
आता है इससे पहले कि c
आप नया स्तंभ जगह कर सकते हैं d
के बाद b
:
i <- seq_len(match("b", colnames(x)))
data.frame(x[i], d, x[-i])
# a b d c
#1 1 4 10 7
#2 2 5 11 8
#3 3 6 12 9
डेटा:
x <- data.frame(a = 1:3, b = 4:6, c = 7:9)
d <- 10:12