tc)
showConnections()
close(tc)
showConnections()
Hope this helps,
Rui Barradas
-pd
On 5 Feb 2025, at 15:35 , Duncan Murdoch wrote:
Thanks to Rui, Peter and Tanvir! Peter's seems to be the fastest of the 3
suggestions so far on the little test case, but on the real data (where x
cont
more, see
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide https://www.R-project.org/posting-
guide.html
and provide commented, minimal, self-contained, reproducible code.
Hello,
Use ?textConnection.
The 5th line is left out, just like in your code.
x <- c("ab
.
#> ..- attr(*, "dimnames")=List of 2
#> .. ..$ : NULL
#> .. ..$ : chr [1:3] "Count" "Mean" "Var"
# ugly output, the matrix column has its colnames
# prefixed with the data.frame's 2nd column name (mpg).
agg3
#> gear mpg.Count
#> if (is.null(object$y) || is.null(object$qr))
#> object <- update(object, y = TRUE, qr = TRUE, ...)
#> result <- NextMethod()
#> if (plotit)
#> invisible(result)
#> else result
#> }
#>
#>
?NextMethod tells you to look in the def
Às 19:38 de 21/01/2025, Rui Barradas escreveu:
Às 02:18 de 21/01/2025, Sorkin, John escreveu:
I have used ggplot to create a graph on which the y-axis is on the log
scale. (see data and code, below.) I would like to add minor tick
marks, which will also be on the log scale. The data and code
minor_breaks =
rep(log10(seq(1, 9, by=1)), times = n_major) +
rep(major_breaks, each = 9)
return(10^(minor_breaks))
}
}
PopByDayByAQIminus %>%
mutate(Day = factor(Day)) %>%
ggplot(
aes(x = AQI_Cat, y = TotalPop/100,
group = Day,
color = Day,
40,60,80,100),
lot1 = c(118,58,42,35,27,25,21,19,18),
lot2 = c(69,35,26,21,18,16,13,12,12))
fit1 <- glm(lot1 ~ log(u), data = clotting, family = gaussian)
fit2 <- lm(lot1 ~ log(u), data = clotting)
# all of the results below are identically equal
sigma(fit1)
rse(fit1)
sigma(fit2)
rse
er of observations n?
[Ans: n - 2 params == length(weight) - 2]
Hope this helps,
Rui Barradas
--
Este e-mail foi analisado pelo software antivírus AVG para verificar a presença
de vírus.
www.avg.com
__
R-help@r-project.org mailing list --
wrap(facets = ~ Species) +
theme(axis.text.x = element_text(angle = 270))
Also, why color the points if the plots are already separated by
Species? Personally, I find it redundant, it adds no information to the
plot.
Unless you want other stuff added to the plot, I would remove
colour = S
[1:3, 1:4] 12 22 32 10 20 30 15 25 35 4 ...
#> ..- attr(*, "dimnames")=List of 2
#> .. ..$ : NULL
#> .. ..$ : chr [1:4] "mean" "min" "max" "nobs"
# this solves it, the method cbind.data.frame is
# called since the 1st argument is a
base
#
# loaded via a namespace (and not attached):
# [1] compiler_4.4.2
#
Hope this helps,
Rui Barradas
--
Este e-mail foi analisado pelo software antivírus AVG para verificar a presença
de vírus.
www.avg.com
__
R-help@r-project.org mailing lis
you don't need to load the package to have access to one of its
data sets,
data(energy, package = "ISwR")
will load it. In this case, it's probably even better, "energy" is not
an uncommon source for data and there might be data sets with the same
name in other p
yr = olddata %>% mutate(first = as.integer(row_number() == 1), .by
= ID)
)
print(mb, order = "median")
However, note that dplyr operates in entire data.frames and therefore is
expected to be slower when tested against instructions that process one
column only.
Hope
ide commented, minimal, self-contained, reproducible code.
Hello,
If you want to shift an entire vector, you don't need the loop, pass the
vector itself to data.table::shift.
x <- data.frame(Id=rep(1:10),num=rep(11:20))
data.table::shift(x[["num"]], n = 1L)
#> [1] N
sorted in ascending order.
ave(olddata$date, olddata$ID, FUN = \(x) x[1L])
#> [1] 1 1 1 1 1 1 1 1 1 1 5 5 5 5 5 5 10 10
If the dates are not sorted,
ave(olddata$date, olddata$ID, FUN = \(x) min(x))
Hope this helps,
Rui Barradas
--
Este e-mail foi analisado pelo softw
the date and
time parts.
x <- "2007-02-01_10:10:30"
as.POSIXct(x, format = "%Y-%m-%d_%H:%M:%S", tz = Sys.timezone())
Hope this helps,
Rui Barradas
--
Este e-mail foi analisado pelo software antivírus AVG para verificar a presença
de vírus.
www.avg.com
_
<- ymd(dat$date1)
or
dat$date1 <- as.Date(dat$date1)
Hope this helps,
Rui Barradas
--
Este e-mail foi analisado pelo software antivírus AVG para verificar a presença
de vírus.
www.avg.com
__
R-help@r-project.org mailing list -- To UNSUBSCR
Or you can test in a small subset of the files
# If this works then it's probably safe to read them all
# (and you don't have to, if it doesn't)
AAR_list <- lapply(filelist[1:3], read.table)
Hope this helps,
Rui Barradas
--
Este e-mail foi analisado pelo software antivírus
, reproducible code.
Hello,
I find it strange that the error is complaining about the 2nd argument,
W[[1]]$year. It seems that column W[[1]]$Precip exists but not year.
What does
str(W[[1]])
return? A data.frame?
And why sep = "" when reading the files, aren't those files cs
e a functionality that only exists in
your system and this can sometimes be a source for unexpected behavior.
as.character.difftime <- function(x) {
u <- units(x)
paste(unclass(x), u)
}
start_time <- Sys.time()
result <- sum(1:10000)
dur_time <- Sys.time() - start_time
as.characte
Às 08:27 de 18/10/2024, Rui Barradas escreveu:
Às 22:50 de 17/10/2024, Sparks, John escreveu:
Hi R Helpers,
I have been looking for an example of how to execute different dplyr
mutate statements on the same dataframe in a single step. I show how
to do what I want to do by going from df0 to
(MRELGE:MSKC, ~case_when(
.x == 0 ~ 0,
.x == 1 ~ 5,
TRUE ~ -99
)),
MGODRK = case_when(
MGODRK == 0 ~ 0,
MGODRK == 1 ~ 5,
TRUE ~ -99
)
)
identical(df3, df3c)
# [1] TRUE
Hope this helps,
Rui Barradas
--
Est
0", "2024-01-01 12:30"), as.POSIXlt, tz =
"CET")
# as documented in ?mapply > sapply, all attributes are lost,
# after simplification the class attribute follows the hierarchy
# NULL < raw < logical < integer < double < complex < character < list &
this helps,
Rui Barradas
--
Este e-mail foi analisado pelo software antivírus AVG para verificar a presença
de vírus.
www.avg.com
__
R-help@r-project.org mailing list -- To UNSUBSCRIBE and more, see
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE
; y 1.056885 0.8704518
Hope this helps,
Rui Barradas
Às 13:28 de 04/10/2024, Steven Yen escreveu:
OK. Thanks to all. Suppose I have two vectors, x and y. Is there a way
to do the covariance matrix with “apply”. The matrix I need really
contains the deviation products divided by the degr
zero, it's
only one value therefore it does not vary. A similar reasonong can be
applied to cov(x[1], x[2]), etc.
Hope this helps,
Rui Barradas
Às 12:14 de 04/10/2024, Steven Yen escreveu:
Hello
I have a vector:
set.seed(123) > n<-3 > x<-rnorm(n); x [1] -0.56047565 -0.23
Hello,
If you have a numeric matrix or data.frame, try something like
cov(mtcars)
Hope this helps,
Rui Barradas
Às 10:15 de 04/10/2024, Steven Yen escreveu:
On 10/4/2024 5:13 PM, Steven Yen wrote:
Pardon me!!!
What makes you think this is a homework question? You are not
obligated to
i <- index(dt_ts) >= from & index(dt_ts) <= to
dt_ts[i]
Also, instead of copying&pasting the data, you can attach a file with
extension .txt.
Hope this helps,
Rui Barradas
--
Este e-mail foi analisado pelo software antivírus AVG para verificar a presença
de vírus.
www.avg.c
n question and if
you have doubts translating the Python code to R code, ask us more
specific questions on those doubts.
Hope this helps,
Rui Barradas
--
Este e-mail foi analisado pelo software antivírus AVG para verificar a presença
de vírus.
w
(y ~ x, data = df),
lm(y ~ x + I(x^2), data = df)))
mydt[[2L]][1L] |> class()
#> [1] "list"
mydt[[2L]][[1L]] |> class()
#> [1] "lm"
Hope this helps,
Rui Barradas
--
Este e-mail foi analisado pelo software antivírus AVG para verificar a prese
Hello,
There is a CRAN Task View: Epidemiology that should be or have what you
are looking for.
[1] https://CRAN.R-project.org/view=Epidemiology
Hope this helps,
Rui Barradas
Às 06:29 de 19/09/2024, Aleena Shaji escreveu:
Dear R Support Team,
I hope this email finds you well.
I am
creates a mean at each position for three subjects,
replacing instead of the value of the single, the group mean.
But when NA appears, all the group gets NA.
Perhaps there is a different way to obtain the same result.
On Mon, 16 Sept 2024 at 11:35, Rui Barradas wrote:
Às 08:28 de 16/09/20
mean(.x, na.rm = TRUE)))
# same result, summarise's new argument .by avoids the need to group_by
db10 %>%
summarise(across(starts_with("cp"), ~ mean(.x, na.rm = TRUE)), .by =
groupid)
Can you post the expected output too?
Hope this helps,
Rui Barradas
--
Este e-mail foi
4 4 3 2 1 3 2112
5 1 NA NA NA NA NA NA NA NA NA NA NA NA
6 2 5 5 10 10 9 10 10 10 NA 109 10", header = TRUE)
df1
library(dplyr)
df1 %>%
mutate(across(starts_with("cp"), ~ +(is.na(.) & id != 1), .names =
"
red$se)
# with more points ahead
predict(model, n.ahead = 2, newxreg = c(10, 12))
Hope this helps,
Rui Barradas
--
Este e-mail foi analisado pelo software antivírus AVG para verificar a presença
de vírus.
www.avg.com
__
R-help@r-project.org mailin
ata_POSIX, "%Y-%m-%d") status hs
#> 1 2024-01-02 D 51.2
# the formats in the OP but extracted from the date/time and used in the
formula that follows.
year <- format(mydf$data_POSIX, "%Y")
month <- format(mydf$data_POSIX, "%m")
day <
-Original Message-
From: R-help On Behalf Of Rui Barradas
Sent: Wednesday, August 28, 2024 4:19 AM
To: Francesca PANCOTTO ; r-help@r-project.org
Subject: Re: [R] Fill NA values in columns with values of another column
[External Email]
Às 11:23 de 27/08/2024, Francesca PANCOTTO via R-help escreveu
21
#> 2172
#> 2272
#> 31 103
#> 32 103
#> 4144
#> 4244
#> 5195
#> 5295
#> 6156
#> 6256
#> 7127
#> 7227
#> 8168
#> 8268
Hope this helps,
R
#> version.string R version 4.4.1 (2024-06-14 ucrt)
#> nickname Race for Your Life
Hope this helps,
Rui Barradas
--
Este e-mail foi analisado pelo software antivírus AVG para verificar a presença
de vírus.
www.avg.com
__
R-help@r-proj
own above. Guess I need to read more
about invisible.
On 8/11/2024 10:09 PM, Rui Barradas wrote:
Às 09:51 de 11/08/2024, Steven Yen escreveu:
Hi
In the following codes, I had to choose between printing (= TRUE) or
deliver something for grab (ei, vi). Is there a way to get both--that
is, to
ing list -- To UNSUBSCRIBE and more, see
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide
http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.
Hello,
Maybe change the end of the code to return a bigger list.
Hello,
.lm.fit is an order of magnitude faster than lm.fit but the Description
section warns on its use, see the examples in help("lm.fit").
Hope this helps,
Rui Barradas
Às 21:08 de 10/08/2024, Yuan Chun Ding via R-help escreveu:
You are right. I also just thought abou
hat you are saying is hardly (not) possible.
If you ever call that code with joint12 set to TRUE, do you reset to
FALSE afterwards?
Can you give a small working example with code and data showing this
behavior?
Hope this helps,
Rui Barradas
--
Este e-mail foi analisado pelo software antiv
ommunist", "minority", "religious", "social",
"no",
"primary", "middle", "high", "veryh", "somewhath", "notveryh",
"verym", "somewhatm", "notverym&
plot.margin = unit(c(0.2, 0, 0.1, 0), "cm"))
p2 <- df %>%
filter(nm != "A") %>%
ggplot(aes(x = date)) +
geom_col(aes(y = val0), na.rm = TRUE, fill = "white") +
geom_line(aes(y = val1)) +
ylab("") +
facet_wrap(~ nm, scales = "fre
re, see
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide
http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.
Hello,
Try to remove
scales="free_y"
from facet_wrap(). With scales="f
ot your posted origin date,
# see the examples on Windows and Excel
# dates in help("as.Date")
as.Date(19024, origin = "1970-01-01")
#> [1] "2022-02-01"
Hope this helps,
Rui Barradas
--
Este e-mail foi analisado pelo software antivírus AVG para verificar a pre
;-rowSums(tmp)
tem2 <-tmp[row0!=0,]
tmp3 <- cor.test(tem2[,1],tem2[,2])
r[i, j] <- tmp3$estimate
P[i, j] <- tmp3$p.value
}
}
}
r<-as.data.frame(r)
P<-as.data.frame(P)
From: R-help On Behalf Of Yuan Chun Ding via
R-help
Sent: Thursday, July 2
38 0.68452834
#> g2 0.7979717 NA 0.4070838 0.06758329
#> g3 0.4070838 0.40708382NA 1.0000
#> g4 0.6845283 0.06758329 1.000 NA
You can put these two results in a list, like Hmisc::rcorr does.
lst_rcorr <- list(r = r, P = P)
Hope this helps,
Rui Bar
R-help@r-project.org mailing list -- To UNSUBSCRIBE and more, see
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.
Hello,
This is not exactly the
Às 17:43 de 18/07/2024, Rui Barradas escreveu:
Às 16:27 de 18/07/2024, SIBYLLE STÖCKLI via R-help escreveu:
Hi
I am using ggplot to visualise y for a two-factorial group (Bio: 0 and
1) x
= 6 years. I was able to adapt the colour of the lines (green and red)
and
the linetype (solid and
d provide commented, minimal, self-contained, reproducible code.
Hello,
To have one legend only, the labels must be the same. Try using
labels=c("ÖLN", "BIO")
in
scale_linetype_manual(values=c("dashed", "solid"), labels=c("ÖLN", "BIO"))
H
algebra
x <- cbind(1, (Dat$Gender == "Male")) %*% coef(Model)
pred1 <- exp(x)/(1 + exp(x))
# use the fitted line equation
y <- coef(Model)[1L] + coef(Model)[2L] * (Dat$Gender == "Male")
pred2 <- exp(y)/(1 + exp(y))
head(predict(Model, type="response"))
head(p
bject it returns and the following
should work.
# this is 'x', a named character vector
coef(fit)
#
fit |> coef() |> names() |> grep("somewhat|very", x = _)
Hope this helps,
Rui Barradas
Às 10:26 de 12/07/2024, Steven Yen escreveu:
Thanks. In this case below, what
p="")
SS[i] <- sum(get(e))
}
SS
#> [1] 55 54 52 49 45
Or all in one instruction with the assistance of ?ls.
# ls(pattern = "^adds") |> mget() |> lapply(sum)
ls(pattern = "^adds") |> mget() |> sapply(sum)
#> adds1 adds2 adds3 adds4 adds5
#>
es)
matrix(nrow = nsims, ncol = 1L + ngrps, dimnames = list(NULL, nms))
}
NSims <- 4
Grps <- 5
create_matrix(NSims, Grps)
#> NSims Value1 Value2 Value3 Value4 Value5
#> [1,]NA NA NA NA NA NA
#> [2,]NA NA NA NA NA NA
#> [3,]
x) - 1L)))
colnames(x) <- nms
x
}
NSims <- 4
Grps <- 5
DiffMeans <- matrix(nrow=NSims,ncol=1+Grps)
names_cols(DiffMeans)
#> NSims Value1 Value2 Value3 Value4 Value5
#> [1,]NA NA NA NA NA NA
#> [2,]NA NA NA NA NA NA
#> [3,]
turn value of lapply
OUTPUT <- lapply(INPUT, \(f) {
mydata <- read.csv(f)
boprobit(eqs, mydata, wt=weight, method="BHHH",
tol=0, reltol=0, gradtol=1e-5, Fisher=TRUE)
})
# assign the output list's names
names(OUTPUT) <- paste0("bop", seq.int(m))
Hope th
line of the output)?
You are right, in the case I posted there were unwanted characters.
Most of the tests I ran there were no additional, unwanted charcters,
though.
This is definitely unstable, that's all I can say.
Hope this helps,
Rui Barradas
Thank you again
Tanguy
1
---
4) GUI: Rgui
Output:
[1] "plot(AirPassengers)" "က \005ⷀǏǭ"
[1] "plot(AirPassengers)"
[1] "plot(AirPassengers)"
[1] "plot(AirPassengers)"
[1] "plot(AirPassengers)"
[1] "plot(AirPassengers)"
[1] "plot(AirPassengers)"
152.8
4705 2012-07-15 0 11.4 665 1179 145.1
4706 2012-07-15 1 9.7 657 1170 145.1
*Jibrin Adejoh Alhassan (Ph.D)*
Department of Physics and Astronomy,
University of Nigeria, Nsukka
On Mon, Jun 17, 2024 at 9:23 AM Rui Barradas wrote:
Às 09:12 de 17/06/2024, Jibrin Alhassan escreveu
71 -9 999.9
6 2012-01-01 5 4.2 368 71 -7 999.9
Many thanks.
*Jibrin Adejoh Alhassan (Ph.D)*
Department of Physics and Astronomy,
University of Nigeria, Nsukka
On Mon, Jun 17, 2024 at 8:14 AM Rui Barradas wrote:
Às 07:53 de 17/06/2024, Jibrin Alhassan escreveu:
Part of it is pasted below
e whole data points. I have tried following
your tested solution but was unsuccessful. My regards.
*Jibrin Adejoh Alhassan (Ph.D)*
Department of Physics and Astronomy,
University of Nigeria, Nsukka
On Sun, Jun 16, 2024 at 8:33 AM Rui Barradas wrote:
Às 21:42 de 15/06/2024, Jibrin Alhassan escr
a has 38735
print(df2)
Error: object 'df2' not found
My data is an hourly data but desire to have the date as
yearmonthday hour
2012 08 01 01
2012 08 01 02
2012 0801 03 etc
Thanks.
*Jibrin Adejoh Alhassan (Ph.D)*
Department of Physi
er needed
df1 <- df1[-(1:2)]
# relocate the new date column
df1 <- df1[c(ncol(df1), 1:(ncol(df1) - 1L))]
head(df1)
#> Date HR IMF SW SSN Dst f10.7
#> 1 2012-08-01 0 3.4 403 132 -9 154.6
#> 2 2012-08-01 1 3.7 388 132 -10 154.6
#> 3 2012-08-01 2 3.7 383 132 -10 1
o see where the error occurred.
Ding
From: Rui Barradas
Sent: Wednesday, June 12, 2024 11:29 AM
To: Yuan Chun Ding ; CALUM POLWART
Cc: r-help@r-project.org
Subject: Re: [R] my R code worked well when running the first 1000 lines of R
code
Hello, Inline. Às 19: 03 de 12/06/2024, Yuan Chun Ding
,
#standard_deviation = sd(value),
.by = c(dat, measure),
.groups = "drop"
)
This is only a guess, the question cannot really be answered.
Hope this helps,
Rui Barradas
but still not resolved the problem.
I will restart from the
19/08/21.
Try
as.Date(Atest$ddate, format = "%d/%m/%y")
Hope this helps,
Rui Barradas
--
Este e-mail foi analisado pelo software antivírus AVG para verificar a presença
de vírus.
www.avg.com
__
R-help@r-project.org mailing list -- To UNSUB
Às 18:40 de 02/06/2024, Rui Barradas escreveu:
Às 18:34 de 02/06/2024, Leo Mada via R-help escreveu:
Dear Shadee,
If you have a data.frame with the following columns:
n = 100; # population size
x = data.frame(
Sex = sample(c("M","F"), n, T),
Country = sample(c(
mented, minimal, self-contained, reproducible code.
Hello,
The following is simpler.
r2 <- xtabs(~ ., x) |> as.data.frame()
r2[-4L] # or r2[names(r2) != "Freq"]
Hope this helps,
Rui Barradas
--
Este e-mail foi analisado pelo software antivírus AVG para verificar a presença
de ví
- Italy
Meteo Section
Snow Section
Via del Colle Ameno 5
60126 Torrette di Ancona, Ancona (AN)
Uff: +39 071 806 7743
E-mail: stefano.so...@regione.marche.it
---Oo-oO
____
Da: Rui Barradas
Inviato: martedì 28 maggio
es a sequence with all the years
years <- Reduce(`:`, years)
# coerce to "Date"
from <- ISOdate(years, 5L, 2L, tz = "Etc/GMT-1")
to <- ISOdate(years, 10L, 30L, tz = "Etc/GMT-1")
# this logical index keeps only the dates between May, 2nd and Nov 1st.
kee
of the format = "%m-%d-%Y" argument.
Let scale_x_date take care of formating the date as you want it
displayed. Any of the two below is a valid date format.
ggplot(data = yyy[1:30,], aes(jdate, Sum)) +
geom_point() +
# scale_x_date(date_labels = "%b %d, %Y")
scale_x_d
Às 09:08 de 21/04/2024, Rui Barradas escreveu:
Às 08:55 de 21/04/2024, Hans W escreveu:
As we all know, in R indices for vectors start with 1, i.e, x[0] is not a
correct expression. Some algorithms, e.g. in graph theory or
combinatorics,
are much easier to formulate and code if 0 is an allowed
i <- i + 1L
NextMethod()
}
as_zerobased <- function(x) {
class(x) <- c("zerobased", class(x))
x
}
x <- 1:10
y <- as_zerobased(x)
y[0]
#> [1] 1
y[1]
#> [1] 2
y[9]
#> [1] 10
y[10]
#> [1] NA
Hope this helps,
Rui Barradas
--
Este e-mail foi analisado pel
%% 2L) == 1L}() |>
which()
data.frame(Col = i, Unbalanced = Unbalanced)
}) |>
do.call(rbind, args = _)
}
# read the data disregardin g quoted strings
df1 <- read.csv(fl, quote = "")
# determine which strings have unbalanced quotes and
# where
unbalance
er is not the most serious problem here.
Hoep this helps,
Rui Barradas
--
Este e-mail foi analisado pelo software antivírus AVG para verificar a presença
de vírus.
www.avg.com
__
R-help@r-project.org mailing list -- To UNSUBSCRIBE and more, see
ht
vol <- 14e6
water_level(l = lev)
#> [1] 7056452
water_level(v = vol)
#> [1] 2480
Hope this helps,
Rui Barradas
--
Este e-mail foi analisado pelo software antivírus AVG para verificar a presença
de vírus.
www.avg.com
__
R-help@r-project.org mailing li
es' not found
# note that the row names are still tapply's names vector
# and that the columns order is not Date/count. Both are fixed
# after the calculations.
res
You can see that the error message is on the pipe. Please, let me know
where I am missing it.
Thanks.
On Wed, Mar 27, 2024
regards from
Ogbos
On Wed, Mar 27, 2024 at 8:44 AM Rui Barradas wrote:
Às 04:30 de 27/03/2024, Ogbos Okike escreveu:
Warm greetings to you all.
Using the tapply function below:
data<-read.table("FD1month",col.names = c("Dates","count"))
x=data$count
f<-factor(d
#> 3 2024-03-24 6.00
#> 4 2024-03-25 4.476190
#> 5 2024-03-26 6.538462
#> 6 2024-03-27 5.20
Also,
I'm glad to help as always but Ogbos, you have been an R-Help
contributor for quite a while, please post data in dput format. Given
the problem the output of the following is
rga\Desktop\R-4.3.3\bin
so that Windows can find R.exe and Rgui.exe without the full path name.
Hope this helps,
Rui Barradas
--
Este e-mail foi analisado pelo software antivírus AVG para verificar a presença
de vírus.
www.avg.com
__
R-help@r-projec
sting-guide.html
and provide commented, minimal, self-contained, reproducible code.
Hello,
Thanks for the data but the code is missing from the attachment.
Can you please post your code? In an attachment or directly in the
e-mail body.
Rui Barradas
--
Este e-mail foi analisado pelo software anti
ec <- sprintf("data%d.csv", 1:24)
data_list <- sapply(file_names_vec, read.csv, simplify = FALSE)
# access the 1st data.frame
data_list[[1L]]
# same as above
data_list[["data1.csv"]]
# same as above
data_list$data1.csv
Hope this helps,
Rui Barradas
--
Este e-mail f
___
R-help@r-project.org mailing list -- To UNSUBSCRIBE and more, see
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the posting guide http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible
ht:
Whenever I have problems updating or installing packages from whithin
RStudio I close RStudio, write a script with the install.packages() call
and run it from a command window.
R -q -f "instscript.R"
This many times works better and it also works with Bioconductor's
BiocMa
aes(Sepal.Length, Sepal.Width, color = Species)) +
geom_point()
g + ylab(expression(paste(frac(
additive~HCO[3]^"-",
true~HCO[3]^"-"
Hope this helps,
Rui Barradas
--
Este e-mail foi analisado pelo software antivírus AVG para verificar a presença
de vírus.
www.avg
ror, an error without a condition message
and no call expression. I find this stranger, a call like the following
is expected.
tryCatch(stop("error"), error = function(e) e) |> str()
List of 2
$ message: chr "error"
$ call : language doTryCatch(return(expr), name, pa
10) %+replace%
theme(
panel.spacing = unit(0, "lines"),
strip.background = element_blank(),
strip.placement = "outside",
# this line was added by me, remove if not wanted
strip.text.x.bottom = element_text(face = "bold", size = 10),
d linear regression for France", x = "Year", y
= "PISA score in mathematics") +
scale_y_continuous(limits=c(470,500),oob=scales::squish)
#
Le lundi 11 décembre 2023 à 23:38:06 UTC+1, Ben Bolker
a écrit :
On 2023-12-11 5:27 p.m., Daniel Nordlund w
_smooth(method = "lm", formula = y ~ x) +
labs(
title = "Standard linear regression for France",
x = "Year",
y = "PISA score in mathematics"
) +
ylim(470, 500)
#> Warning message:
#> In max(ids, na.rm = TRUE) : no non-missing arguments to
Às 16:30 de 07/12/2023, Rui Barradas escreveu:
Às 16:21 de 07/12/2023, Sorkin, John escreveu:
Colleagues,
I have a matrix of character data that represents date and time. The
format of each element of the matrix is
"2020-09-17_00:00:00"
How can I convert the elements into a valid R
as.POSIXct
Don't forget the underscore in the format.
as.POSIXct("2020-09-17_00:00:00", format = "%Y-%m-%d_%H:%M:%S")
Hope this helps,
Rui Barradas
--
Este e-mail foi analisado pelo software antivírus AVG para verificar a presença
de vírus.
www.avg.com
_
e http://www.R-project.org/posting-guide.html
and provide commented, minimal, self-contained, reproducible code.
Hello,
Your link points to a GitHub repository, the package can be installed with
devtools::install_github(repo = "Sibada/sibadaR")
Hope this helps
Rui Barradas
--
Est
Às 17:57 de 30/11/2023, Rui Barradas escreveu:
Às 17:38 de 30/11/2023, Robert Baer escreveu:
I am having trouble using back ticks with the R extractor function
'predict' and an lm() model. I'm trying too construct some nice
vectors that can be used for plotting the two type
value (y-tilde uses 'p')
# usual trick is to assign x to actual x-var name in middle dataframe
arguement
CI.p = predict(mod2, newdata = newd, interval = 'prediction')# fail
Hope this helps,
Rui Barradas
--
Este e-mail foi analisado pelo software antivírus AVG para verifi
, "Neu", "Neu",
"Neu",
"Neu", "Neu", "Neu", "Neu", "Neu", "Neu", "Neu", "Neu",
"Pos",
"Pos", "Pos", "Pos", "Pos", &
_D - se_D, ymax = mean_D + se_D), fill =
"grey", alpha = 0.5) +
geom_line(aes(y = mean_D, color = C)) +
geom_point(aes(y = D, color = C)) +
scale_color_manual(name = "Concentration", values = clrs)
Hope this helps,
Rui Barradas
--
Este e-mail foi anali
code.
Hello,
Yes, CRAN is down.
I know last week there was an anouncement about a maintenance scheduled
but I cannot place that e-mail right now and don't remember the date
exactly so I cannot say for sure this is what is happening.
But it is probably a scheduled maintenance.
Rui Bar
ile, rename it .txt?
See [1], section General Instructions for more on this
[1] https://www.r-project.org/mail.html#instructions
Hope this helps,
Rui Barradas
--
Este e-mail foi analisado pelo software antivírus AVG para verificar a presença
de víru
1 - 100 of 1048 matches
Mail list logo