e way as they simply do on my desktop or old laptop.
I'd be grateful for any ideas or pointers
Thanks
Nick Wray
[[alternative HTML version deleted]]
______
R-help@r-project.org mailing list -- To UNSUBSCRIBE and more, see
https://stat.ethz.c
Oh fab it works! thanks v much i'd never used open file like that before Nick
> On 21 May 2018 at 12:24 Duncan Murdoch wrote:
>
>
> On 21/05/2018 7:20 AM, Nick Wray via R-help wrote:
> > Hello. I'm not sure whether this is strictly the right forum but here
> &
options in graphics software, like photoshop
or inkscape).
Here some example code:
x <- matrix(c(1:10), 2,5)
par(lwd = 5)
barplot(x, beside=T, border=rep(c(NA, 'black'),5), space=c(0.08,1),
col=rep(c('black', 'white'),5))
Thank you!
______
above V (in the Y axis) thera are more W and below level V there are
> more M.
>
> Can you please guide me?
>
> In excel putting Y as X axis is easy but dind´nt achieve to invert rows and
> I ´m trying to plot it in R.
>
> Many thanks in advance
>
> [[alternative HTML version deleted]]
>
> ___
bootstrap samples
nboot=100
bootstrap.MedAESQ =rep(NA,nboot)
for(i in 1 :nboot)
{
fit <- rq( crp ~ bmi+glucose, tau = 0.5)
ypred=predict(fit)
y=new$crp
bootstrap.MedAESQ [i]=median(y-ypred)^2
lst[i]<-bootstrap.MedAESQ
}
mean(unlist(lst))
###
______
n I remove a certain feature or observation by a part of its name.
>> To be clear, I have a matrix with 766 observations as a rows. The row names
>> are like this
>>
>> 70/556
>> 71.1/280
>> 72.1/556
>> 72.1/343
>> 73.1/390
>> 73.1/556
>&g
ts?
>>
>
> Hi,
>
> If you grab the plots as grobs, you can arrange them using grid.arrange()
>
> library(gridGraphics)
> library(gridExtra)
>
> grab <- function{
> grid.echo()
> grid.grab()
> }
>
> x <- rnorm(100, 1, 2)
> y <- rnorm(100, 0
8
> > So that in de Y axis will be the level (qualitative data) and in the X
> axis
> > will be M and W variables. So x axis will be wwith a lenght between 0 and
> > 2000.
> >
> > I would like to plot a line with M and other with W so it will be obvious
> > tha
;
>
> You can see that the variable is coded as 0, 1, 2, but group 1 is 'empty'.
> So I want to remove this group, such that I get:
>
> > summary(DF$Anxiolytics)
>0 2 NA's
> 1102 20 440
>
> And then I want to recode the variable in a way
looking for the "median squared error", shouldn't the
> final line of the function be
>
> median((y - ypred)^2)
>
>
> Dan
>
[[alternative HTML version deleted]]
______
R-help@r-project.org mailing list -- To UNSUBS
acQueen
Lawrence Livermore National Laboratory
7000 East Ave., L-627
Livermore, CA 94550
925-423-1062
Lab cell 925-724-7509
On 5/24/18, 8:14 AM, "R-help on behalf of Ioanna Ioannou"
wrote:
Hello everyone,
Thank you for this. Nonetheless it is not exactly want i ne
ne, there might be a speedup from
converting to a matrix and using rbind() on matrices. Data frames have some
overhead that matrices don't, especially if factors are involved.
-Don
--
Don MacQueen
Lawrence Livermore National Laboratory
7000 East Ave., L-627
Livermore, CA 94550
925-423-1062
L
1 0 0 1 0
0 0 0 0 0 1
Anyone can help me? Many Thanks.
Regards,
Zuhri
| | Virus-free. www.avast.com |
[[alternative HTML version deleted]]
__
R-help@r-project.org mailing list
Setup rates
inA<- kinA*A
outA<- A*koutA
A <-A+inA-outA
val[1,t] <- A
t <-t+1
}
# Step 6: Print the output as array
value <- data.frame(val)
# Transpose 'value' using t
value <- t(value)
value
[[alternative HTML version deleted]]
___
ould add a column, say "clean" and
assign it a value "Y." Is there a way to do this in dplyr or should I
be looking at a different way.
Thanks in advance for your help.
Regards,
Sumit
__
R-help@r-project.org mailing list -- To UNSUB
Hi R help,
I wanted to simulate two pool model (A&B) using deSolve package for time 0 to
12 by 1. Initial values of the state variables are A=5, B=3. The fluxes are as
follows1) Flux into A= 5 units per unit time 2) Flux from A to B= 0.33) Flux
out of A=0.1 4) Flux from B to A=0.35) Flux
ould be helpful to say
which package.
-Don
--
Don MacQueen
Lawrence Livermore National Laboratory
7000 East Ave., L-627
Livermore, CA 94550
925-423-1062
Lab cell 925-724-7509
On 6/1/18, 4:20 AM, "R-help on behalf of Bill Poling"
wrote:
Good morning, I hope someone can help
arning comes from the second step.
Print tnr.ma and you will see some NAs.
-Don
--
Don MacQueen
Lawrence Livermore National Laboratory
7000 East Ave., L-627
Livermore, CA 94550
925-423-1062
Lab cell 925-724-7509
From: Bill Poling
Date: Friday, June 1, 2018 at 8:58 AM
To: "MacQueen, Don"
whose names
> are contained in 'lis'. eval(parse(ls(pattern="pr"))) will not do but
> returning TRUE.
>
> TIA
> C.
> --
> Christian Hoffmann
> Rigiblickstrasse 15b
> CH-8915 Hausen am Albis
> Switzerland
> Telefon +41-(0)44-7640853
>
> __
--
Don MacQueen
Lawrence Livermore National Laboratory
7000 East Ave., L-627
Livermore, CA 94550
925-423-1062
Lab cell 925-724-7509
From: Bill Poling
Date: Friday, June 1, 2018 at 10:43 AM
To: "MacQueen, Don" , array R-help
Subject: RE: [R] Time-series moving average question
Hi Don
fy the timezone when coverting
from character to datetime is using the 'tz' argument. A timezone as part of
the character string will be ignored (see the formatting codes in ?strptime).
I almost always use as.POSIXct() instead of strptime() for conversion from
character to datetime
version deleted]]
__
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
col="#00CC66")
>
> But I do not return what I want.
>
> Thank you very much
>
> ML
>
>
>
> [[alternative HTML version deleted]]
>
> ______
> R-help@r-project.org mailing list -- To UNSUBSCRIBE and more, see
> https
.8, 0.4, 132))
> }
> Nothing occurs (there is no output file created, but also no error)
>
> When I use RunningScript.R
> {
> commandArgs <- c(0.6,0.4,132)
> source("Arg Script.R')
> }
> I don't get any args passed into the file. Instead getting the
ersity of Sousse, Tunisia
> Tel.: 216 97 276 835
> Email: ibrahimi.is...@gmail.com
>
> [[alternative HTML version deleted]]
>
> __
> R-help@r-project.org mailing list -- To UNSUBSCRIBE and more, see
> https://stat.ethz.ch/mailman/li
tion, RecenterPeriods), fileConn)
close(fileConn)
looks to me like it's more complex than needed.
I would suggest
cat( TotalDeviation, IndividualDeviation, RecenterPeriods, '\n',
file='output.txt')
--
Don MacQueen
Lawrence Livermore National Laboratory
7000 East
7000 East Ave., L-627
Livermore, CA 94550
925-423-1062
Lab cell 925-724-7509
On 6/15/18, 8:58 AM, "R-help on behalf of lejeczek via R-help"
wrote:
hi there
installation of the package fails:
...
g++ -m64 -std=gnu++11 -I"/usr/include/R" -DN
[1] "2" "b" "4"
However,
> lapply( 1:length(YH), function(i) { YH[[i]][iuhV[i]]})
[[1]]
[1] 2
[[2]]
[1] "b"
[[3]]
[1] 4
--
Don MacQueen
Lawrence Livermore National Laboratory
7000 East Ave., L-627
Livermore, CA 94550
925-423-1062
Lab cell 925-724-7509
ermore National Laboratory
7000 East Ave., L-627
Livermore, CA 94550
925-423-1062
Lab cell 925-724-7509
On 6/18/18, 2:53 PM, "R-help on behalf of Jeff Newmiller"
wrote:
FAQ 7.31, or take a university course in numerical analysis.
https://cran.r-project.org/doc/FA
gt;> Dear R community,
> >> I have a question seems very simple but have trouble to do it.
> >> I have a list which stores many data frames. Now, I want to perform
> log10 on one column in each data frame in the list and save the value as a
> new column back to the origina
ld* have had an error on your second try:
> as.Date(1998-02-10)
Error in as.Date.numeric(1998 - 2 - 10) : 'origin' must be supplied
-Don
--
Don MacQueen
Lawrence Livermore National Laboratory
7000 East Ave., L-627
Livermore, CA 94550
925-423-1062
Lab cell 925-724-7509
On 6
ASB, I got an errorann_text <-
data.frame(Q = 20, fit = 1.03, lab = "Text", asb = factor("ASB1",levels =
c("1","2","3")))
#Error in FUN(X[[i]], ...) : object 'ASB' not found
I would very much appreciate for your help.
Thank you very
SB1", ASB2", "ASB3"))
p + geom_text(data = ann_text, aes(label = plot_lab)
should do the trick
HTH
Ulrik
On 2018-06-25 09:50, Maria Lathouri via R-help wrote:
> Dear all,
>
>
> I am trying to add text only in the first panel of a faceted ggplot; I
> have be
to perform various testing using web-browser. I
> have installed firefox to do the same, however to make RSelenium work, it
> requires display parameter as guided in below link:
> https://medium.com/@griggheo/running-selenium-webdriver-
> tests-using-firefox-headless-mode-on-ubuntu-d32
he maximum pathname is 255
characters but is that the same thing?
Thanks if anyone can enlighten me
Nick Wray
[[alternative HTML version deleted]]
______
R-help@r-project.org mailing list -- To UNSUBSCRIBE and more, see
https://stat.ethz.ch/mailman/listi
of 4096. If
> you are simply writing a file to the current path, it won't make much
> difference.
>
> Jim
>
> On Thu, Jun 28, 2018 at 8:33 AM, Nick Wray via R-help
> wrote:
> > Hi For various reasons too dull to go into I have been trying to write csv
> > files
uld be considered as nested or crossed.Does the following model seems
correct to you ?Score~1+Cond+(1|Subject)+(1|item).Any help would be much
appreciated.______
R-help@r-project.org mailing list -- To UNSUBSCRIBE and more, see
https://stat.ethz.ch/mailman/listi
27
Livermore, CA 94550
925-423-1062
Lab cell 925-724-7509
On 6/28/18, 12:53 PM, "R-help on behalf of Kelly Wu"
wrote:
I am working on a clinical trial simulation with two groups, treatment and
placebo, and the outcome is dichotomous (recovery or no recovery) . I would
data.frame(first3 = c("Al3", "Barbara", "Carol"), second3 = c("Jones",
"Smith", "Adams")),
data.frame(first4 = ("Al"), second4 = "Jones2"))
bind_rows(lapply(employees4List, function(x) rbind.data.frame(c(t(x)
Th
send an email
to ggplot2+unsubscribe@ googlegroups.com.
For more options, visit https://groups.google.com/d/ optout.
[[alternative HTML version deleted]]
__
R-help@r-project.org mailing list -- To UNSUBSCRIBE and more, see
https://stat.ethz
ror message? The
> same function is working perfectly well in windows(I used parLapply instead
> of mclapply).
> Is this peculiar to R on Linux? Please help
>
> very many thanks for your time and effort,
> Yours sincerely,
> AKSHAY M KULKARNI
>
>
> [[altern
2) doesn't work.
Thank you.
Sincerely,
Jérôme
__
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 com
arbara", "Carol"), second3 = c("Jones",
> "Smith", "Adams")),
> data.frame(first4 = ("Al"), second4 = "Jones2"))
>
> ###
>
> dfbycol <- function(x) {
> x <- lapply(x, function(y)as.vector(t(as.matrix(y
&g
t people keep coming along
> and sticking things into it."
> -- Opus (aka Berkeley Breathed in his "Bloom County" comic strip )
>
> On Fri, Jun 29, 2018 at 5:29 PM, Ira Sharenow via R-help
> mailto:r-help@r-project.org>> wrote:
>
>
> Sarah and Da
= c(NA, -1L))
DF2 <- read.table( text =
"Start End
John Adams
Thomas Jefferson
", header = TRUE, as.is = TRUE )
DFL <- list( DF1, DF2 )
# DFNames is a set of unique identifiers
DFL1 <- data_frame( .DFNames = sprintf( "DF%d", 1:2 )
)
)
)
}
listFinal3 <- lapply( employees4List, myrename3 )
listFinal3
#> [[1]]
#> First1 Second1
#> 1 Al Jones
#>
#> [[2]]
#> First1 Second1 First2 Second2
#> 1 Al2 Jones Barb Smith
#>
#> [[3]]
#> First1 Second1 First2 Second2 Fir
Ron,
Many thanks for your help! This solution meets perfectly my needs. I just had
to set ylim
to make the axes match.
Best wishes,
Jérôme
De : Rolf Turner
À : Jérôme François
Cc : "r-help@R-project.org" ; rob.hynd...@monash.edu
Envoyé le : Same
On Mon, Jul 2, 2018 at 5:02 AM, Morkus via R-help
wrote:
> Hello,
>
> I have a strange side-effect from executing R-scripts using R and RServe.
>
> I am executing an R-Script from a Java file using RServe in R. I also have
> RStudio installed, but it's not running at the t
once, starting one with
.libPaths("C:/tmp/newRLibrary")
to use the new ggplot2 and the othe without that line to use the old ggpot2.
Bill Dunlap
TIBCO Software
wdunlap tibco.com
On Tue, Jul 3, 2018 at 2:08 PM, Roy Mendelssohn - NOAA Federal via R-help <
r-help@r-project.org> wrote:
stallation of package
‘C:/Users/Maryam/Documents/R/igraph0_0.5.5-1.tar.gz’ had non-zero exit status
[[alternative HTML version deleted]]
__
R-help@r-project.org mailing list -- To UNSUBSCRIBE and more, see
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do rea
Hi, I’m maryam that ask question about "igraph0" package installation in
R-help. I thank you for your answering. i used and install “igraph” library in
R but i faced with below error when I use this command :
results <- gspan(database)
Error:
Error in library(igraph0) : there
nction instead of the for loop? How do we get the progress
of an ongoing "apply" family of functions?
Very many thanks for your time and effort...
yours sincerely,
AKSHAY M KULKARNI
[[alternative HTML version deleted]]
______
R-help@r-project.
not necessary
## testing for FALSE does not need == "FALSE"
# if(identical(snlcqn,snlcqna) == "FALSE"){
# return(snlcqna) }
#
# else {
# return(snlcqn)
Or (perhaps preferably) "US/Pacific" for daylight savings time support.
--
Don MacQueen
Lawrence Livermore National Laboratory
7000 East Ave., L-627
Livermore, CA 94550
925-423-1062
Lab cell 925-724-7509
On 7/9/18, 1:46 AM, "R-help on behalf of Jeff Newmiller"
wrote:
al creation of the data frames).
>
> Thanks,
>
> Kevin
>
> --
> Kevin E. Thorpe
> Head of Biostatistics, Applied Health Research Centre (AHRC)
> Li Ka Shing Knowledge Institute of St. Michael's
> Assistant Professor, Dalla Lana School of Public Health
> Universit
cell 925-724-7509
On 7/9/18, 5:13 AM, "R-help on behalf of Laura Steel"
wrote:
I am a beginner to R and I need to map some Atlantic puffin migration routes
onto a map of the Northern Hemisphere. I have a latitude and longitude point
per bird, per day. I would like to
Hi,
I am learning R for forecasting. Is there any document where I can learn how to
apply R in forecasting time series using Holt-Winters method and ARIMA
modelling?
Thanks,Amitabh
[[alternative HTML version deleted]]
__
R-help@r-project.org
There's a CRAN Task View on optimization. There might be something useful there.
-Don
--
Don MacQueen
Lawrence Livermore National Laboratory
7000 East Ave., L-627
Livermore, CA 94550
925-423-1062
Lab cell 925-724-7509
On 7/13/18, 11:43 AM, "R-help on behalf of Federico Becerr
me. (If this were
> >Python,
> >people would accuse me of being "non-pythonic").
> >
> >Hence, I'm seeking suggestions for the best practice for this kind of
> >thing.
> >
> >BTW, I note that both the sources of data ("alpha", etc.) and
problem?
Thank you,
Best regards,
Pietro Fabbro
[[alternative HTML version deleted]]
__
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.
rule(strategy.st, name = "ruleSignal",
arguments = list(sigcol = "longthreshold", sigval = TRUE,
orderqty = "all", ordertype = "market",
orderside = "short", replace = FALSE,
prefer = "Open"),
type = "exit")
out <- applyStr
ot;, ordertype = "market",
orderside = "short", replace = FALSE,
prefer = "Open"),
type = "exit")
out <- applyStrategy(strategy = strategy.st, portfolios = portfolio.st)
When I run the traceback() of the error, this is what I get:
> traceback()
4: stop("attempt to set 'colnames' on an object with less than two dimensions")
3: `colnames<-`(`*tmp*`, value = seq(ncol(tmp_val)))
2: applyIndicators(strategy = strategy, mktdata = mktdata, parameters =
parameters,
...)
1: applyStrategy(strategy = strategy.st, portfolios = portfolio.st
__
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.
ignal",
arguments = list(sigcol = "longthreshold", sigval = TRUE,
orderqty = "all", ordertype = "market",
orderside = "short", replace = FALSE,
prefer = "Open"),
type = "exit")
out <- applyStrategy(strategy = strategy.st, portfolios
UNSCRIBE
[[alternative HTML version deleted]]
__
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
us engineering folks.
Thank you kindly!
Shawn Way, PE
-Original Message-
From: Jeff Newmiller
Sent: Wednesday, July 18, 2018 9:26 PM
To: Shawn Way
Cc: r-help@r-project.org
Subject: Re: [R] xtable does not print out units of a variable
On Wed, 18 Jul 2018, Shawn Way wrote:
> I have
ring folks.
>
> Thank you kindly!
>
> Shawn Way, PE
>
> -Original Message-
> From: Jeff Newmiller
> Sent: Wednesday, July 18, 2018 9:26 PM
> To: Shawn Way
> Cc: r-help@r-project.org
> Subject: Re: [R] xtable does not print out units of a variable
>
&
ment for the group names if they overlap
> data.
> Space is a premium - you can reduce the right margin similar to the top see
> ?trellis.par.get()
>
> Regards
>
> Duncan
>
> Duncan Mackay
> Department of Agronomy and Soil Science
> University of New England
> Armi
-01" "2015-10-01" ...
>
> The command and results on this dataframe is:
> wy2016$myTime <- as.POSIXct(paste(wy2016$date, wy2016$time))
> Error in as.POSIXlt.character(x, tz, ...) :
> character string is not in a standard unambiguous format
>
> Data for ot
gt; That's why I asked for help: I saw nothing different in the dates or times.
>
> Regards,
>
>
> Rich
>
> ______
> R-help@r-project.org mailing list -- To UNSUBSCRIBE and more, see
> https://stat.ethz.ch/mailman/listinfo/r-help
> PLEA
none? Did the resulting dates look OK? Perhaps
>> all is well.
>>
>
> Bill,
>
> All dates here are kept as -mm-dd.
>
> And each dataframe row has this format:
> 2015-10-01,00:00,90.6689
> 2015-10-01,01:00,90.6506
> 2015-10-01,02:00,90.6719
> 2015-
> wy2016$dt_time <- with( wy2016, as.POSIXct( paste( date, time ) , format=
>> "%Y-%m-%d %H:%M") )
>>
>
> Thank you. This found 24 TRUEs; now to find them in the file.
>
> Thanks,
>
> Rich
>
>
> ______
&g
n deleted]]
______
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.
on problems I've just had after
migrating to Linux Mint 19, this should work for you. Good luck. :)
--
Clive Nicholas
"My colleagues in the social sciences talk a great deal about methodology.
I prefer to call it style." -- Freeman J. Dyson
[[alternative HTML version del
ant to work within R.
That's a given. Why would I prefer Rscript over R CMD BATCH, or
vice-versa? I did not see much difference between the two in their help
files.
Regards,
Rich
__
R-help@r-project.
t;>>
>>> ///
>>> To call in the statistician after the experiment is done may be no more
>>> than asking him to perform a post-mortem examination: he may be able to
>>>
se if that's useful.
I prefer to use packages that are based on the DBI package.
-Don
--
Don MacQueen
Lawrence Livermore National Laboratory
7000 East Ave., L-627
Livermore, CA 94550
925-423-1062
Lab cell 925-724-7509
On 7/25/18, 7:57 AM, "R-help on behalf of Doran, Harold"
w
work now on the right drivers that might be appropriate
for centos, but if anyone happens to know, hints are appreciated
Harold
-Original Message-
From: MacQueen, Don [mailto:macque...@llnl.gov]
Sent: Thursday, July 26, 2018 11:26 AM
To: Doran, Harold ; '
r, df = df_approx)
n.temp <- ((tkrit.alpha + tkrit.beta)^2)/(c^2)
}
I can hard code df_approx to be an absolute value but I don't know if
that messes up the statistics.
Can anyone help or any ideas? How to fix?
John.
__
R-help@r-project.org
n script using emacs so it seems to be specific to R.
>
> All thoughts, ideas, and suggestions are welcome.
>
> Rich
>
> __
> R-help@r-project.org mailing list -- To UNSUBSCRIBE and more, see
> https://stat.ethz.ch/mailman/listinf
7;ll contact the package maintainer about
> upgrading (which I'll do here).
>
> Best regards,
>
> Rich
>
> ______
> R-help@r-project.org mailing list -- To UNSUBSCRIBE and more, see
> https://stat.ethz.ch/mailman/listinfo/r-help
> PLEAS
ner.
>
> ?maintainer
>
> Cheers,
> Bert
>
> Bert Gunter
>
> "The trouble with having an open mind is that people keep coming along and
> sticking things into it."
> -- Opus (aka Berkeley Breathed in his "Bloom County" comic strip )
>
> On
se the following code
> to do:
>
> df <- readLines(file)
> l <- grep("Data Points", df)
>
> However, in this case, the file will be read throughout into R. When the
> file is huge, it will cost much memory and time.
>
> Is there any more elegant way to d
ues" on the "total" row blank. The sum/total row is to be combined to the
> original data.frame, yielding a data.frame with five columns and eleven rows.
>
> Thanks, in advance.
> Bruce
>
>
> __
> Bruce Ratner PhD
> The Significant Statistician™
>
uce Ratner PhD
> The Significant Statistician™
>
>
>
>
> [[alternative HTML version deleted]]
>
> __
> R-help@r-project.org mailing list -- To UNSUBSCRIBE and more, see
> https://stat.ethz.ch/mailman/listinfo/r-help
> PLEASE do re
Again, you should always copy the R-help list on replies to your OP.
The short answer is you **shouldn't** replace NAs with blanks in your
matrix or dataframe. NA is the proper designation for those cell
positions. Replacing NA with a "blank" in a dataframe will convert
t
er, one can
>> usually use an existing function to push your results out without damaging
>> your working data.
>>
>> It is important to separate your data from your output because mixing
>> results (totals) with data makes using the data further extremely difficu
Starting R with the --vanilla flag will cause it to ignore startup
files. This is usually a quicker way to rule out such issues than
tracking down where the startup files are stored. 'R --help' tells
about other command line arguments that help home in on which file may
be the proble
suggest something? I have tried tiff and
rtiff libraries.
Thanks in advance.
[[alternative HTML version deleted]]
__
R-help@r-project.org mailing list -- To UNSUBSCRIBE and more, see
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the
laky
> about multiple instances of a single program.
>
> John
>
> __
> 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/p
large'?
>
> Jim Holtman
> Data Munger Guru
>
> What is the problem that you are trying to solve?
> Tell me what you want to do, not how you want to do it.
>
>
> On Tue, Apr 4, 2017 at 7:47 AM, Louisa Reynolds via R-help
> wrote:
>> Dear Forum
>&g
r
>>>> All best wishes
>>>> Troels Ring
>>>> Aalborg, Denmark
>>>> Windows
>>>> R version 3.3.2 (2016-10-31)
>>>>
>>>>
>>>> A <- structure(c(1364450400, 1364450400, 1364536800, 1364623200,
>>>> 136470
led
>> getLineNumber (suppose one exists!), then the result would be 3.
>>
>> 1 # This is start of script
>> 2
>> 3 print( getLineNumber() )
>> 4
>> 5 # End of script
>>
>> Thanks for any ideas!
>>
>> [[alternative HTML vers
R clogs this list
> unnecessarily.
>
> -Original Message-
> From: Bruce Ratner PhD [mailto:b...@dmstat1.com]
> Sent: Monday, April 10, 2017 2:13 PM
> To: Doran, Harold
> Cc: r-help@r-project.org
> Subject: Re: [R] Too strange that I cannot install several packages
>
>
Since 2008, Microsoft (formerly Revolution Analytics) staff and guests
have written about R every weekday at the Revolutions blog
(http://blog.revolutionanalytics.com) and every month I post a summary
of articles from the previous month of particular interest to readers
of r-help.
In case you
help will be appreciated.
Thank you.
[[alternative HTML version deleted]]
__
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
blems of being mammals.
>
> -K. Mullis
>
> "A big computer, a complex algorithm and a long time does not equal
> science."
>
> -Robert Gentleman
>
> [[alternative HTML version deleted]]
>
&
in a much more straightforward
manner, but then I am probably missing some point, subtle or otherwise.
Carl Sutton
__
R-help@r-project.org mailing list -- To UNSUBSCRIBE and more, see
https://stat.ethz.ch/mailman/listinfo/r-help
PLEASE do read the
zero length, is to show that vector to the seq function as
an example of how long to make the result.
--
Sent from my phone. Please excuse my brevity.
On April 14, 2017 2:55:48 PM PDT, Carl Sutton via R-help
wrote:
>
>
>Hi
>
>
>just messing around today and am now perple
>> Sys.getenv("HOME") [1] "C:/Users/BruceRatner/Documents"
>> Sys.getenv("R_HOME") [2] "C:/PROGRA~1/R/R-33~1.3"
>
>
>
> --
>
> __
> R-help@r-project.org mailing list -- To UNSUBSCRIBE and more, see
> http
"!" in base, so do I have some kind
of ridiculous error or ..??
Carl Sutton
__
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-proj
601 - 700 of 3942 matches
Mail list logo