[R] Timestamp of exported files not updated when the file name is overwritten (ggsave)

2015-03-19 Thread David Villegas Ríos
Hi.
I have a script in which I export some plots to a folder in my PC. The
plots are exported with the function ggsave (in ggplot2).
Whenever I re-run the code and export updated plots, the name of the
exported file is overwritten (as expected) but the timestamp is not updated
what turns it very difficult to locate them, sometimes.

Any thought or solution for this issue?

Thanks,

David

[[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 provide commented, minimal, self-contained, reproducible code.


Re: [R-es] preg

2015-03-19 Thread Emilio L. Cano
La viñeta del paquete tiene ejemplos:

 library(tm) vignette(tm)


El jue., 19 de marzo de 2015 a las 10:43, jbetancourt (
jbetanco...@iscmc.cmw.sld.cu) escribió:

 Estimados

 ?podrían enviarme un ejemplo en el que analicen un documento de texto con
 la librería library(tm)

 mis saludos cordiales
  jose

 [[alternative HTML version deleted]]

 ___
 R-help-es mailing list
 R-help-es@r-project.org
 https://stat.ethz.ch/mailman/listinfo/r-help-es


[[alternative HTML version deleted]]

___
R-help-es mailing list
R-help-es@r-project.org
https://stat.ethz.ch/mailman/listinfo/r-help-es


Re: [R] Which is better: Modifying an existing package or creating a new one?

2015-03-19 Thread Thierry Onkelinx
I would consider a third option: suggest the changes to the package
authors. The authors might include your modifications to the original
package if they feel that it would improve their package.

Otherwise go for option 2. Option 1 will be harder to maintain if you want
benefit from the updates on the packages A, B, C, D, E.

Best regards,

ir. Thierry Onkelinx
Instituut voor natuur- en bosonderzoek / Research Institute for Nature and
Forest
team Biometrie  Kwaliteitszorg / team Biometrics  Quality Assurance
Kliniekstraat 25
1070 Anderlecht
Belgium

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 say
what the experiment died of. ~ Sir Ronald Aylmer Fisher
The plural of anecdote is not data. ~ Roger Brinner
The combination of some data and an aching desire for an answer does not
ensure that a reasonable answer can be extracted from a given body of data.
~ John Tukey

2015-03-19 8:56 GMT+01:00 jpm miao miao...@gmail.com:

 Hi,

Given that I frequently use A, B, C, D, E packages.
In each of the 5 packages, I intend to modify one of the functions.
Two ways:

 1st: Modify A, B, C, D, E to A', B', C', D', E'
Then I will use library(A') . library(E') instead of A, B, C, D, E.
or Just keep the names A, B, C, D, E but modify the content

 2nd: create a package F and add the five functions to the F package. For
 each of the 5 functions, a line library(A)... or library(E) is
 required.

 Then I will need library(F) when I create a new program.

Which is a better way in terms of time consumption and code portability?
 If I move the codes to a new computer, which way will be easier?

Any suggestion?

Thanks,

 Miao

 [[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 provide commented, minimal, self-contained, reproducible code.


[[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 provide commented, minimal, self-contained, reproducible code.


[R] Which is better: Modifying an existing package or creating a new one?

2015-03-19 Thread jpm miao
Hi,

   Given that I frequently use A, B, C, D, E packages.
   In each of the 5 packages, I intend to modify one of the functions.
   Two ways:

1st: Modify A, B, C, D, E to A', B', C', D', E'
   Then I will use library(A') . library(E') instead of A, B, C, D, E.
   or Just keep the names A, B, C, D, E but modify the content

2nd: create a package F and add the five functions to the F package. For
each of the 5 functions, a line library(A)... or library(E) is required.

Then I will need library(F) when I create a new program.

   Which is a better way in terms of time consumption and code portability?
If I move the codes to a new computer, which way will be easier?

   Any suggestion?

   Thanks,

Miao

[[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 provide commented, minimal, self-contained, reproducible code.


Re: [R] how to get coefficient and scores of Principal component analysis in R?

2015-03-19 Thread smb123
Actually, the loadings are quite different from the coefficients.  The
loadings are simply correlations of the original values to the scores for a
PCA factor.  The coefficients, on the other hand, allow one to compute the
scores.  There is a coefficient for each variable.  The coefficient is
multiplied with the standardized variable and then added to the next
coefficient multiplied by its standardized variable ets.  The general
formula 

http://r.789695.n4.nabble.com/file/n4704832/PCA_formula.jpg 



--
View this message in context: 
http://r.789695.n4.nabble.com/how-to-get-coefficient-and-scores-of-Principal-component-analysis-in-R-tp3245198p4704832.html
Sent from the R help mailing list archive at Nabble.com.

__
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.


[R] glm in hdlm?

2015-03-19 Thread Stanislav Aggerwal
I am following the example in the vignette for hdlm (p. 19), but I cannot
get it to to fit a logistic. For those who don't know the package, it
allows one to fit high dimensional data where the number of variables may
exceed the number of cases.

library(hdlm)

LMFUN - function(x,y) return(glm(y ~ x, family=binomial(link=logit)))
FUNCVFIT - function(x,y) return(cv.glmnet(x, y, family='binomial'))

set.seed(1234)
xx-matrix(runif(20*4),20,4)  #20 cases, 4 variables
xx[,1]-xx[,1]+1:20
yy-c(0,0,0,1,0,1,1,0,1,0,1,0,1,0,1,1,1,1,1,1)

#ordinary glms are fitted with no problems with yy either factor or numeric
fit1-glm(as.factor(yy)~xx,family=binomial)
fit2-glm(yy~xx,family=binomial)

fit3-hdlm(as.factor(yy) ~ xx, LMFUN = LMFUN, FUNCVFIT = FUNCVFIT)

This produces the error:

Error in { :
  task 1 failed - (list) object cannot be coerced to type 'double'
In addition: There were 11 warnings (use warnings() to see them)
=

fit4-hdlm(yy ~ xx, LMFUN = LMFUN, FUNCVFIT = FUNCVFIT)

This produces:

Error in { :
  task 1 failed - (list) object cannot be coerced to type 'double'
In addition: Warning messages:
1: Option grouped=FALSE enforced in cv.glmnet, since  3 observations per
fold
2: Option grouped=FALSE enforced in cv.glmnet, since  3 observations per
fold
3: Option grouped=FALSE enforced in cv.glmnet, since  3 observations per
fold
4: Option grouped=FALSE enforced in cv.glmnet, since  3 observations per
fold
5: Option grouped=FALSE enforced in cv.glmnet, since  3 observations per
fold
6: Option grouped=FALSE enforced in cv.glmnet, since  3 observations per
fold
7: Option grouped=FALSE enforced in cv.glmnet, since  3 observations per
fold
8: Option grouped=FALSE enforced in cv.glmnet, since  3 observations per
fold
9: Option grouped=FALSE enforced in cv.glmnet, since  3 observations per
fold
10: Option grouped=FALSE enforced in cv.glmnet, since  3 observations per
fold
=

Please tell me how to fit the glm in hdlm. Thanks very much for any help.

Stan

[[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 provide commented, minimal, self-contained, reproducible code.


[R-es] preg

2015-03-19 Thread jbetancourt
Estimados

?podr�an enviarme un ejemplo en el que analicen un documento de texto con la 
librer�a library(tm) 

mis saludos cordiales
 jose

[[alternative HTML version deleted]]

___
R-help-es mailing list
R-help-es@r-project.org
https://stat.ethz.ch/mailman/listinfo/r-help-es


[R] glmnet: converting coefficients back to original scale

2015-03-19 Thread Mark Seeto
Dear R-help,

I'm having trouble understanding how glmnet converts its coefficient
estimates back to the original scale. Here's an example with ridge
regression:


library(glmnet)
set.seed(1)

n - 20  # sample size

d - data.frame(x1 = rnorm(n, 1, 1), x2 = rnorm(n, 10, 2), y = rnorm(n, 1, 2))

# Sample means
mx1 - mean(d$x1)
mx2 - mean(d$x2)
my - mean(d$y)

# Scaling factors (1/n standard deviations)
sx1 - sd(d$x1)*sqrt((n - 1)/n)
sx2 - sd(d$x2)*sqrt((n - 1)/n)
sy - sd(d$y)*sqrt((n - 1)/n)

# Scaled variables
d$x1s - (d$x1 - mx1)/sx1
d$x2s - (d$x2 - mx2)/sx2
d$ys - (d$y - my)/sy

lam - 0.5  # lambda value

# Using scaled variables (same result for standardize=TRUE and
standardize=FALSE)
glmnet1 - glmnet(as.matrix(d[, c(x1s, x2s)]), d$ys, alpha=0, lambda = lam)

# Using unscaled variables
glmnet2 - glmnet(as.matrix(d[, c(x1, x2)]), d$y, alpha=0, lambda=lam)

coef(glmnet2)
## s0
## (Intercept)  2.5658491
## x1   0.3471199
## x2  -0.1703715

# I want to calculate the glmnet2 coef estimates from the glmnet1 coef
estimates.
# The following attempts are based on rearrangement of
# (y - my)/sy = beta1*(x1 - mx1)/sx1 + beta2*(x2 - mx2)/sx2

my - coef(glmnet1)[x1s, s0]*mx1*sy/sx1 - coef(glmnet1)[x2s,
s0]*mx2*sy/sx2
# 2.430971
# Not the same as coef(glmnet2)[(Intercept), s0]

coef(glmnet1)[x1s, s0]*sy/sx1
# 0.3096897
# Not the same as coef(glmnet2)[x1, s0]

coef(glmnet1)[x2s, s0]*sy/sx2
# -0.1524043
# Not the same as coef(glmnet2)[x2, s0]

##

I can apply a similar method (with centring of y instead of
standardisation) to successfully get the coefficient estimates on the
original scale given by lm.ridge in the MASS package. I would
appreciate any help anyone can give on where I'm going wrong with
glmnet.

Thanks,
Mark

__
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.


[R] Order Bars in ggplot2 bar graph

2015-03-19 Thread michael.eisenring
Dear experts,
I am trying to make a bar graph using ggplot2. I would like to define the order 
of my bars independently of alphabetical or numerical order.
How can I do that.
Here a simplified example of my code and comments(#) describing my problem:


#Code start


library(ggplot2)

bar-ggplot(data,aes(Leaf,Av_Glands_cor,fill=Damage))



# The column Leaf  contains the variable C_1, C_2 and C_Cot. R always plots 
the bars in the following orders : C_1 (closest to the y-axis), C_2, C_Cot

# How do I have to modify my code that the order of the bars is: C_Cot, C_2, 
C_1?



bar+stat_summary(fun.y=mean,geom=bar,position=dodge,colour=black)+

  theme_bw()+

  theme(text = element_text(size=15),

axis.text.x = element_text(angle=90, vjust=1))+

stat_summary(fun.data=mean_cl_normal,geom=errorbar,position=position_dodge(width=0.9),width=0.4,colour=gray65)+

labs(x=Leaf,y=Average nr. glands corrected for leaf sz.,fill=Damage)+

  scale_fill_manual(values=c(gray95, gray75, gray45, black))

#Code end


Thank you very much,
Michael Eisenring

Eisenring Michael, Msc.
PhD Student

Federal Department of Economic Affairs, Education and Research
EAER
Institute of Sustainability Sciences ISS
Biosafety

Reckenholzstrasse 191, CH-8046 Z�rich
Tel. +41 44 37 77181
Fax +41 44 37 77201
michael.eisenr...@agroscope.admin.chmailto:michael.eisenr...@agroscope.admin.ch
www.agroscope.chhttp://www.agroscope.ch/


[[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 provide commented, minimal, self-contained, reproducible code.

Re: [R] Order Bars in ggplot2 bar graph

2015-03-19 Thread Thierry Onkelinx
You need to set the levels of the factor in the required order.

data$Leaf - factor(data$Leaf, levels = c(C_Cot, C_2, C_1))

ir. Thierry Onkelinx
Instituut voor natuur- en bosonderzoek / Research Institute for Nature and
Forest
team Biometrie  Kwaliteitszorg / team Biometrics  Quality Assurance
Kliniekstraat 25
1070 Anderlecht
Belgium

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 say
what the experiment died of. ~ Sir Ronald Aylmer Fisher
The plural of anecdote is not data. ~ Roger Brinner
The combination of some data and an aching desire for an answer does not
ensure that a reasonable answer can be extracted from a given body of data.
~ John Tukey

2015-03-19 10:06 GMT+01:00 michael.eisenr...@agroscope.admin.ch:

 Dear experts,
 I am trying to make a bar graph using ggplot2. I would like to define the
 order of my bars independently of alphabetical or numerical order.
 How can I do that.
 Here a simplified example of my code and comments(#) describing my problem:


 #Code start


 library(ggplot2)

 bar-ggplot(data,aes(Leaf,Av_Glands_cor,fill=Damage))



 # The column Leaf  contains the variable C_1, C_2 and C_Cot. R always
 plots the bars in the following orders : C_1 (closest to the y-axis), C_2,
 C_Cot

 # How do I have to modify my code that the order of the bars is: C_Cot,
 C_2, C_1?



 bar+stat_summary(fun.y=mean,geom=bar,position=dodge,colour=black)+

   theme_bw()+

   theme(text = element_text(size=15),

 axis.text.x = element_text(angle=90, vjust=1))+


 stat_summary(fun.data=mean_cl_normal,geom=errorbar,position=position_dodge(width=0.9),width=0.4,colour=gray65)+

 labs(x=Leaf,y=Average nr. glands corrected for leaf sz.,fill=Damage)+

   scale_fill_manual(values=c(gray95, gray75, gray45, black))

 #Code end


 Thank you very much,
 Michael Eisenring

 Eisenring Michael, Msc.
 PhD Student

 Federal Department of Economic Affairs, Education and Research
 EAER
 Institute of Sustainability Sciences ISS
 Biosafety

 Reckenholzstrasse 191, CH-8046 Zürich
 Tel. +41 44 37 77181
 Fax +41 44 37 77201
 michael.eisenr...@agroscope.admin.chmailto:
 michael.eisenr...@agroscope.admin.ch
 www.agroscope.chhttp://www.agroscope.ch/


 [[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 provide commented, minimal, self-contained, reproducible code.


[[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 provide commented, minimal, self-contained, reproducible code.

[R] R Course in Dublin (April 15-17)

2015-03-19 Thread Antony Unwin
Details at  

http://insightsc.ie/training/r-statistical-software/

Antony Unwin
University of Augsburg, Germany and Insight Statistical Consulting, Dublin, 
Ireland
__
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.


[R] Tele_R - first experiences

2015-03-19 Thread Dr. Wolfgang Lindner
Dear R community,

some days ago Enric Cervera Mateu has installed an R client
with instant messaging, which is usable very simple via the
public name @Tele_R in the messenger Telegram.

I have tested Tele_R and e.g. tried most of the examples from
[1] W.N. Venables, D.M. Smith, R Core Team. An Introduction to R. R Core 
Team. iBooks.
and of §1 of
[2] B. Everitt, T. Hothorn. An R and S-plus Companion to Multivariate 
Analysis. Springer.
All is working very good in this environment.

I am very impressed. I like the possibility to use R without installation
complications with my iPhone, iPad or HTC One.
The answers are send very fast, the idea to use a chat for mathematics
communication seems to be especially suited to beginners:
direct dive in, OS as you like, working anywhere, talking over distance,
communicate with your peers or students (share code or
examples etc even during a lesson - if a beamer is not available) etc.

I would like to thank Enric for his valuable work to make the great work of
the R team accessible to smartphones and tablets.
I think that Tele_R is a very comfortable tool for teaching and learning R
at an undergraduate level.

And I would like to hear about the experiences, opinions or ideas of other
members of the R community with respect of the use of Tele_R.

I hope that this is not the wrong list to say these words.

Best,
Wolfgang Lindner
Leichlingen, Germany

__
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.


Re: [R] not a Stata version 5-12 .dta file

2015-03-19 Thread Anthony Damico
doesn't just running this solve your problem?

https://github.com/ajdamico/usgsd/blob/master/World%20Values%20Survey/download%20all%20microdata.R


On Fri, Mar 20, 2015 at 12:04 AM, Nicole Ford nicole.f...@me.com wrote:

 Anthony,

 Thanks for this.  The issue I am having is WVS didn’t save all of their
 stata files, it seems, as .dta.  Further, the .rdata files are not loading
 correctly, either, giving me .Traceback or crashes R when I try to source
 it.  I will poke around your link to see if it can provide any insight.

 ~n







 On Mar 19, 2015, at 9:09 PM, Anthony Damico ajdam...@gmail.com wrote:

 hi nicole, i have published easy to reproduce, well-documented code to
 download and then analyze every file from every wave of the world values
 survey here.  the download automation script should solve your problem, or
 at least work around it  :)

 http://www.asdfree.com/search/label/world%20values%20survey%20%28wvs%29





 On Thu, Mar 19, 2015 at 6:09 PM, Nicole Ford nicole.f...@me.com wrote:

 the text  didn’t send for the R data file erros.  sorry about that.


 2015-03-19 17:41:38.544 R[398:5728] Unable to simultaneously satisfy
 constraints:
 (
 NSAutoresizingMaskLayoutConstraint:0x618966c0 h=-- v=--
 H:|-(0)-[NSView:0x6032da20]   (Names: '|':FIFinderView:0x6080003612c0
 ),
 NSAutoresizingMaskLayoutConstraint:0x612881b0 h=-- v=--
 H:[NSView:0x6032da20]-(0)-|   (Names: '|':FIFinderView:0x6080003612c0
 ),
 NSAutoresizingMaskLayoutConstraint:0x60a8c710 h=-- v=--
 H:|-(0)-[FIFinderView:0x6080003612c0]   (Names:
 '|':NSNavFinderViewFileBrowser:0x608000375fc0 ),
 NSAutoresizingMaskLayoutConstraint:0x6128eb50 h=-- v=--
 H:[FIFinderView:0x6080003612c0]-(0)-|   (Names:
 '|':NSNavFinderViewFileBrowser:0x608000375fc0 ),
 NSAutoresizingMaskLayoutConstraint:0x60c93fb0 h=-- v=--
 H:[NSNavFinderViewFileBrowser:0x608000375fc0(585)],
 NSLayoutConstraint:0x6149d740 H:|-(0)-[NSView:0x60133ec0]
  (Names: '|':NSView:0x6032da20 ),
 NSLayoutConstraint:0x61489880 H:[NSView:0x60133ec0]-(0)-|
  (Names: '|':NSView:0x6032da20 ),
 NSLayoutConstraint:0x6109e280
 H:[FILocationPopUp:0x603fda00(207)],
 NSLayoutConstraint:0x60a82760 NSView:0x60133ec0.centerX ==
 FILocationPopUp:0x603fda00.centerX,
 NSLayoutConstraint:0x60e835c0
 H:[FILocationPopUp:0x603fda00]-(=10)-[SGTSearchField:0x603bf800],
 NSLayoutConstraint:0x6069f2c0
 H:[SGTSearchField:0x603bf800]-(11)-|   (Names:
 '|':NSView:0x60133ec0 ),
 NSLayoutConstraint:0x606801e0
 H:[SGTSearchField:0x603bf800(=218)]
 )

 Will attempt to recover by breaking constraint
 NSLayoutConstraint:0x606801e0
 H:[SGTSearchField:0x603bf800(=218)]

 Set the NSUserDefault
 NSConstraintBasedLayoutVisualizeMutuallyExclusiveConstraints to YES to have
 -[NSWindow visualizeConstraints:] automatically called when this happens.
 And/or, break on objc_exception_throw to catch this in the debugger.
  str(dat)
  chr [1:2] .Traceback WV3_Data_rdata_v_2014_09_21
  ls(dat)
 Error in as.environment(pos) :
   no item called .Traceback on the search list
  dat
 [1] .Traceback  WV3_Data_rdata_v_2014_09_21
  sessionInfo()
 R version 3.1.3 (2015-03-09)
 Platform: x86_64-apple-darwin13.4.0 (64-bit)
 Running under: OS X 10.10.1 (Yosemite)

 locale:
 [1] en_US.UTF-8/en_US.UTF-8/en_US.UTF-8/C/en_US.UTF-8/en_US.UTF-8

 attached base packages:
 [1] stats graphics  grDevices utils datasets  methods   base

 other attached packages:
  [1] readstata13_0.5-3 effects_3.0-3 lattice_0.20-30   lme4_1.1-7
 Rcpp_0.11.2   Matrix_1.1-5  runjags_1.2.1-0   sm_2.2-5.4
  [9] foreign_0.8-63car_2.0-25

 loaded via a namespace (and not attached):
  [1] coda_0.16-1  colorspace_1.2-4 grid_3.1.3   MASS_7.3-39
 mgcv_1.8-4   minqa_1.2.3  nlme_3.1-120 nloptr_1.0.0
  nnet_7.3-9
 [10] parallel_3.1.3   pbkrtest_0.4-2   quantreg_5.11SparseM_1.6
 splines_3.1.3tools_3.1.3
 




  On Mar 19, 2015, at 5:08 PM, Nicole Ford nicole.f...@me.com wrote:
 
  Ista,
 
  I am pulling multiple countries and multiple waves, but here is one
 country in one wave.  I know if I can get one to work, I can get them all
 to work.  I have used WVS data in the past and never encountered any
 issues, so I am at a loss here.  Thanks again!
 
  http://www.worldvaluessurvey.org/WVSDocumentationWV3.jsp
 http://www.worldvaluessurvey.org/WVSDocumentationWV3.jsp
 
 
  ~Nicole
 
 
 
 
 
 
  On Mar 19, 2015, at 4:59 PM, Ista Zahn istaz...@gmail.com mailto:
 istaz...@gmail.com wrote:
 
  Is the file publicly available? What is the URL?
 
  Best,
  Ista
 
  On Thu, Mar 19, 2015 at 4:46 PM, Nicole Ford nicole.f...@me.com
 mailto:nicole.f...@me.com wrote:
  Hello, Ista.
 
  Honestly, I am uncertain.  I don't have STATA -- I downloaded this
 from the data source website.
 
  I can't imagine it is 13 because the data are old (2006).
 
  I tried package 

Re: [R] not a Stata version 5-12 .dta file

2015-03-19 Thread Anthony Damico
hi nicole, i have published easy to reproduce, well-documented code to
download and then analyze every file from every wave of the world values
survey here.  the download automation script should solve your problem, or
at least work around it  :)

http://www.asdfree.com/search/label/world%20values%20survey%20%28wvs%29





On Thu, Mar 19, 2015 at 6:09 PM, Nicole Ford nicole.f...@me.com wrote:

 the text  didn’t send for the R data file erros.  sorry about that.


 2015-03-19 17:41:38.544 R[398:5728] Unable to simultaneously satisfy
 constraints:
 (
 NSAutoresizingMaskLayoutConstraint:0x618966c0 h=-- v=--
 H:|-(0)-[NSView:0x6032da20]   (Names: '|':FIFinderView:0x6080003612c0
 ),
 NSAutoresizingMaskLayoutConstraint:0x612881b0 h=-- v=--
 H:[NSView:0x6032da20]-(0)-|   (Names: '|':FIFinderView:0x6080003612c0
 ),
 NSAutoresizingMaskLayoutConstraint:0x60a8c710 h=-- v=--
 H:|-(0)-[FIFinderView:0x6080003612c0]   (Names:
 '|':NSNavFinderViewFileBrowser:0x608000375fc0 ),
 NSAutoresizingMaskLayoutConstraint:0x6128eb50 h=-- v=--
 H:[FIFinderView:0x6080003612c0]-(0)-|   (Names:
 '|':NSNavFinderViewFileBrowser:0x608000375fc0 ),
 NSAutoresizingMaskLayoutConstraint:0x60c93fb0 h=-- v=--
 H:[NSNavFinderViewFileBrowser:0x608000375fc0(585)],
 NSLayoutConstraint:0x6149d740 H:|-(0)-[NSView:0x60133ec0]
  (Names: '|':NSView:0x6032da20 ),
 NSLayoutConstraint:0x61489880 H:[NSView:0x60133ec0]-(0)-|
  (Names: '|':NSView:0x6032da20 ),
 NSLayoutConstraint:0x6109e280
 H:[FILocationPopUp:0x603fda00(207)],
 NSLayoutConstraint:0x60a82760 NSView:0x60133ec0.centerX ==
 FILocationPopUp:0x603fda00.centerX,
 NSLayoutConstraint:0x60e835c0
 H:[FILocationPopUp:0x603fda00]-(=10)-[SGTSearchField:0x603bf800],
 NSLayoutConstraint:0x6069f2c0
 H:[SGTSearchField:0x603bf800]-(11)-|   (Names:
 '|':NSView:0x60133ec0 ),
 NSLayoutConstraint:0x606801e0
 H:[SGTSearchField:0x603bf800(=218)]
 )

 Will attempt to recover by breaking constraint
 NSLayoutConstraint:0x606801e0
 H:[SGTSearchField:0x603bf800(=218)]

 Set the NSUserDefault
 NSConstraintBasedLayoutVisualizeMutuallyExclusiveConstraints to YES to have
 -[NSWindow visualizeConstraints:] automatically called when this happens.
 And/or, break on objc_exception_throw to catch this in the debugger.
  str(dat)
  chr [1:2] .Traceback WV3_Data_rdata_v_2014_09_21
  ls(dat)
 Error in as.environment(pos) :
   no item called .Traceback on the search list
  dat
 [1] .Traceback  WV3_Data_rdata_v_2014_09_21
  sessionInfo()
 R version 3.1.3 (2015-03-09)
 Platform: x86_64-apple-darwin13.4.0 (64-bit)
 Running under: OS X 10.10.1 (Yosemite)

 locale:
 [1] en_US.UTF-8/en_US.UTF-8/en_US.UTF-8/C/en_US.UTF-8/en_US.UTF-8

 attached base packages:
 [1] stats graphics  grDevices utils datasets  methods   base

 other attached packages:
  [1] readstata13_0.5-3 effects_3.0-3 lattice_0.20-30   lme4_1.1-7
   Rcpp_0.11.2   Matrix_1.1-5  runjags_1.2.1-0   sm_2.2-5.4
  [9] foreign_0.8-63car_2.0-25

 loaded via a namespace (and not attached):
  [1] coda_0.16-1  colorspace_1.2-4 grid_3.1.3   MASS_7.3-39
 mgcv_1.8-4   minqa_1.2.3  nlme_3.1-120 nloptr_1.0.0
  nnet_7.3-9
 [10] parallel_3.1.3   pbkrtest_0.4-2   quantreg_5.11SparseM_1.6
 splines_3.1.3tools_3.1.3
 




  On Mar 19, 2015, at 5:08 PM, Nicole Ford nicole.f...@me.com wrote:
 
  Ista,
 
  I am pulling multiple countries and multiple waves, but here is one
 country in one wave.  I know if I can get one to work, I can get them all
 to work.  I have used WVS data in the past and never encountered any
 issues, so I am at a loss here.  Thanks again!
 
  http://www.worldvaluessurvey.org/WVSDocumentationWV3.jsp 
 http://www.worldvaluessurvey.org/WVSDocumentationWV3.jsp
 
 
  ~Nicole
 
 
 
 
 
 
  On Mar 19, 2015, at 4:59 PM, Ista Zahn istaz...@gmail.com mailto:
 istaz...@gmail.com wrote:
 
  Is the file publicly available? What is the URL?
 
  Best,
  Ista
 
  On Thu, Mar 19, 2015 at 4:46 PM, Nicole Ford nicole.f...@me.com
 mailto:nicole.f...@me.com wrote:
  Hello, Ista.
 
  Honestly, I am uncertain.  I don't have STATA -- I downloaded this
 from the data source website.
 
  I can't imagine it is 13 because the data are old (2006).
 
  I tried package readstata13 out of desperation, but didn't think it
 would resolve.
 
  Thanks for the suggestion!
 
  Sent from my iPhone
 
  On Mar 19, 2015, at 4:41 PM, Ista Zahn istaz...@gmail.com mailto:
 istaz...@gmail.com wrote:
 
  Hi Nicole,
 
  Is it a stata 13 data file? If so your best bet is to open it in Stata
  and use the saveold command to save it as a stata 12 file.
 
  Best,
  Ista
 
  On Thu, Mar 19, 2015 at 3:00 PM, Nicole Ford nicole.f...@me.com
 mailto:nicole.f...@me.com wrote:
  Hello,
 
  I recently updated to the newest version of R and I am encountering
 issues.  Please find my error and session info below.  

Re: [R] not a Stata version 5-12 .dta file

2015-03-19 Thread Nicole Ford
Anthony,

Thanks for this.  The issue I am having is WVS didn’t save all of their stata 
files, it seems, as .dta.  Further, the .rdata files are not loading correctly, 
either, giving me .Traceback or crashes R when I try to source it.  I will poke 
around your link to see if it can provide any insight.

~n







 On Mar 19, 2015, at 9:09 PM, Anthony Damico ajdam...@gmail.com wrote:
 
 hi nicole, i have published easy to reproduce, well-documented code to 
 download and then analyze every file from every wave of the world values 
 survey here.  the download automation script should solve your problem, or at 
 least work around it  :)
 
 http://www.asdfree.com/search/label/world%20values%20survey%20%28wvs%29 
 http://www.asdfree.com/search/label/world%20values%20survey%20%28wvs%29
 
 
 
 
 
 On Thu, Mar 19, 2015 at 6:09 PM, Nicole Ford nicole.f...@me.com 
 mailto:nicole.f...@me.com wrote:
 the text  didn’t send for the R data file erros.  sorry about that.
 
 
 2015-03-19 17:41:38.544 R[398:5728] Unable to simultaneously satisfy 
 constraints:
 (
 NSAutoresizingMaskLayoutConstraint:0x618966c0 h=-- v=-- 
 H:|-(0)-[NSView:0x6032da20]   (Names: '|':FIFinderView:0x6080003612c0 ),
 NSAutoresizingMaskLayoutConstraint:0x612881b0 h=-- v=-- 
 H:[NSView:0x6032da20]-(0)-|   (Names: '|':FIFinderView:0x6080003612c0 ),
 NSAutoresizingMaskLayoutConstraint:0x60a8c710 h=-- v=-- 
 H:|-(0)-[FIFinderView:0x6080003612c0]   (Names: 
 '|':NSNavFinderViewFileBrowser:0x608000375fc0 ),
 NSAutoresizingMaskLayoutConstraint:0x6128eb50 h=-- v=-- 
 H:[FIFinderView:0x6080003612c0]-(0)-|   (Names: 
 '|':NSNavFinderViewFileBrowser:0x608000375fc0 ),
 NSAutoresizingMaskLayoutConstraint:0x60c93fb0 h=-- v=-- 
 H:[NSNavFinderViewFileBrowser:0x608000375fc0(585)],
 NSLayoutConstraint:0x6149d740 H:|-(0)-[NSView:0x60133ec0]   
 (Names: '|':NSView:0x6032da20 ),
 NSLayoutConstraint:0x61489880 H:[NSView:0x60133ec0]-(0)-|   
 (Names: '|':NSView:0x6032da20 ),
 NSLayoutConstraint:0x6109e280 
 H:[FILocationPopUp:0x603fda00(207)],
 NSLayoutConstraint:0x60a82760 NSView:0x60133ec0.centerX == 
 FILocationPopUp:0x603fda00.centerX,
 NSLayoutConstraint:0x60e835c0 
 H:[FILocationPopUp:0x603fda00]-(=10)-[SGTSearchField:0x603bf800],
 NSLayoutConstraint:0x6069f2c0 
 H:[SGTSearchField:0x603bf800]-(11)-|   (Names: '|':NSView:0x60133ec0 
 ),
 NSLayoutConstraint:0x606801e0 
 H:[SGTSearchField:0x603bf800(=218)]
 )
 
 Will attempt to recover by breaking constraint
 NSLayoutConstraint:0x606801e0 H:[SGTSearchField:0x603bf800(=218)]
 
 Set the NSUserDefault 
 NSConstraintBasedLayoutVisualizeMutuallyExclusiveConstraints to YES to have 
 -[NSWindow visualizeConstraints:] automatically called when this happens.  
 And/or, break on objc_exception_throw to catch this in the debugger.
  str(dat)
  chr [1:2] .Traceback WV3_Data_rdata_v_2014_09_21
  ls(dat)
 Error in as.environment(pos) :
   no item called .Traceback on the search list
  dat
 [1] .Traceback  WV3_Data_rdata_v_2014_09_21
  sessionInfo()
 R version 3.1.3 (2015-03-09)
 Platform: x86_64-apple-darwin13.4.0 (64-bit)
 Running under: OS X 10.10.1 (Yosemite)
 
 locale:
 [1] en_US.UTF-8/en_US.UTF-8/en_US.UTF-8/C/en_US.UTF-8/en_US.UTF-8
 
 attached base packages:
 [1] stats graphics  grDevices utils datasets  methods   base
 
 other attached packages:
  [1] readstata13_0.5-3 effects_3.0-3 lattice_0.20-30   lme4_1.1-7
 Rcpp_0.11.2   Matrix_1.1-5  runjags_1.2.1-0   sm_2.2-5.4
  [9] foreign_0.8-63car_2.0-25
 
 loaded via a namespace (and not attached):
  [1] coda_0.16-1  colorspace_1.2-4 grid_3.1.3   MASS_7.3-39  
 mgcv_1.8-4   minqa_1.2.3  nlme_3.1-120 nloptr_1.0.0 nnet_7.3-9
 [10] parallel_3.1.3   pbkrtest_0.4-2   quantreg_5.11SparseM_1.6  
 splines_3.1.3tools_3.1.3
 
 
 
 
 
  On Mar 19, 2015, at 5:08 PM, Nicole Ford nicole.f...@me.com 
  mailto:nicole.f...@me.com wrote:
 
  Ista,
 
  I am pulling multiple countries and multiple waves, but here is one country 
  in one wave.  I know if I can get one to work, I can get them all to work.  
  I have used WVS data in the past and never encountered any issues, so I am 
  at a loss here.  Thanks again!
 
  http://www.worldvaluessurvey.org/WVSDocumentationWV3.jsp 
  http://www.worldvaluessurvey.org/WVSDocumentationWV3.jsphttp://www.worldvaluessurvey.org/WVSDocumentationWV3.jsp
   http://www.worldvaluessurvey.org/WVSDocumentationWV3.jsp
 
 
  ~Nicole
 
 
 
 
 
 
  On Mar 19, 2015, at 4:59 PM, Ista Zahn istaz...@gmail.com 
  mailto:istaz...@gmail.com mailto:istaz...@gmail.com 
  mailto:istaz...@gmail.com wrote:
 
  Is the file publicly available? What is the URL?
 
  Best,
  Ista
 
  On Thu, Mar 19, 2015 at 4:46 PM, Nicole Ford nicole.f...@me.com 
  mailto:nicole.f...@me.com mailto:nicole.f...@me.com 
  mailto:nicole.f...@me.com wrote:
  

[R] r2wd (Write R to Word) in Chinese

2015-03-19 Thread jpm miao
Hi,

   The package r2wd is good at writing MS Word document from R.

   Can Chinese be written into MS Word by this package or any other method
from R? Are Chinese fonts (e.g., Kai 楷書) available in r2wd?

Thanks!

[[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 provide commented, minimal, self-contained, reproducible code.

Re: [R] not a Stata version 5-12 .dta file

2015-03-19 Thread Ista Zahn
That is not a Stata data file, but a plain text data file. You can try
reading it into R like

x - read.table(WV3_Data_Russia_1995_stata_v_2014_04_28.dat,
fill = TRUE)

but you won't know what anything is. The metadata is in the .dct file,
in a format only Stata can love...

Best,
Ista

On Thu, Mar 19, 2015 at 9:50 PM, Nicole Ford nicole.f...@me.com wrote:
 It seems the problem I am having is actually on the WVS end. The files I am
 downloading seem to have incorrect endings?  for example:

 WV3_Data_Russia_1995_stata_v_2014_04_28.dat

 I have emailed them and let them know.
 ~Nicole Ford
 Ph.D. Candidate/ Instructor
 University of South Florida
 Government and International Affairs
 Visitor, University of Rochester
 office: Gavett 303P
 e: nicole.f...@me.com
 http://usf.academia.edu/NicoleFord






 On Mar 19, 2015, at 8:53 PM, Ista Zahn istaz...@gmail.com wrote:

 Does

 /Users/nicoleford/Desktop/Russia2006.dta

 exist? What does

 list.files(/Users/nicoleford/Desktop, pattern = \\.dta)

 say?

 On Thu, Mar 19, 2015 at 8:35 PM, Nicole Ford nicole.f...@me.com wrote:

 ok so after another restart- I got rid of some of the errors.  But I am
 still unable to load and R is telling me it is not a stata13 file.

 dat - read.dta13(file.choose())

 Error: First byte: Not a version 13 dta-file.

 options(useFancyQuotes=F)
 dat - read.dta(file.choose())

 Error in read.dta(file.choose()) : not a Stata version 5-12 .dta file

 options(useFancyQuotes=F)
 dat - read.dta('/Users/nicoleford/Desktop/Russia2006.dta')

 Error in read.dta(/Users/nicoleford/Desktop/Russia2006.dta) :
  unable to open file: 'No such file or directory'

 dat - read.dta(file='/Users/nicoleford/Desktop/Russia2006.dta')

 Error in read.dta(file = /Users/nicoleford/Desktop/Russia2006.dta) :
  unable to open file: 'No such file or directory’

 I’m really at a loss.
 ~Nicole Ford
 Ph.D. Candidate/ Instructor
 University of South Florida
 Government and International Affairs
 Visitor, University of Rochester
 office: Gavett 303P
 e: nfo...@ur.rochester.edu
 http://usf.academia.edu/NicoleFord






 On Mar 19, 2015, at 6:09 PM, Nicole Ford nicole.f...@me.com wrote:

 the text  didn’t send for the R data file erros.  sorry about that.


 2015-03-19 17:41:38.544 R[398:5728] Unable to simultaneously satisfy
 constraints:
 (
NSAutoresizingMaskLayoutConstraint:0x618966c0 h=-- v=--
 H:|-(0)-[NSView:0x6032da20]   (Names: '|':FIFinderView:0x6080003612c0
 ),
NSAutoresizingMaskLayoutConstraint:0x612881b0 h=-- v=--
 H:[NSView:0x6032da20]-(0)-|   (Names: '|':FIFinderView:0x6080003612c0
 ),
NSAutoresizingMaskLayoutConstraint:0x60a8c710 h=-- v=--
 H:|-(0)-[FIFinderView:0x6080003612c0]   (Names:
 '|':NSNavFinderViewFileBrowser:0x608000375fc0 ),
NSAutoresizingMaskLayoutConstraint:0x6128eb50 h=-- v=--
 H:[FIFinderView:0x6080003612c0]-(0)-|   (Names:
 '|':NSNavFinderViewFileBrowser:0x608000375fc0 ),
NSAutoresizingMaskLayoutConstraint:0x60c93fb0 h=-- v=--
 H:[NSNavFinderViewFileBrowser:0x608000375fc0(585)],
NSLayoutConstraint:0x6149d740 H:|-(0)-[NSView:0x60133ec0]
 (Names: '|':NSView:0x6032da20 ),
NSLayoutConstraint:0x61489880 H:[NSView:0x60133ec0]-(0)-|
 (Names: '|':NSView:0x6032da20 ),
NSLayoutConstraint:0x6109e280
 H:[FILocationPopUp:0x603fda00(207)],
NSLayoutConstraint:0x60a82760 NSView:0x60133ec0.centerX ==
 FILocationPopUp:0x603fda00.centerX,
NSLayoutConstraint:0x60e835c0
 H:[FILocationPopUp:0x603fda00]-(=10)-[SGTSearchField:0x603bf800],
NSLayoutConstraint:0x6069f2c0
 H:[SGTSearchField:0x603bf800]-(11)-|   (Names: '|':NSView:0x60133ec0
 ),
NSLayoutConstraint:0x606801e0
 H:[SGTSearchField:0x603bf800(=218)]
 )

 Will attempt to recover by breaking constraint
 NSLayoutConstraint:0x606801e0 H:[SGTSearchField:0x603bf800(=218)]

 Set the NSUserDefault
 NSConstraintBasedLayoutVisualizeMutuallyExclusiveConstraints to YES to have
 -[NSWindow visualizeConstraints:] automatically called when this happens.
 And/or, break on objc_exception_throw to catch this in the debugger.

 str(dat)

 chr [1:2] .Traceback WV3_Data_rdata_v_2014_09_21

 ls(dat)

 Error in as.environment(pos) :
  no item called .Traceback on the search list

 dat

 [1] .Traceback  WV3_Data_rdata_v_2014_09_21

 sessionInfo()

 R version 3.1.3 (2015-03-09)
 Platform: x86_64-apple-darwin13.4.0 (64-bit)
 Running under: OS X 10.10.1 (Yosemite)

 locale:
 [1] en_US.UTF-8/en_US.UTF-8/en_US.UTF-8/C/en_US.UTF-8/en_US.UTF-8

 attached base packages:
 [1] stats graphics  grDevices utils datasets  methods   base

 other attached packages:
 [1] readstata13_0.5-3 effects_3.0-3 lattice_0.20-30   lme4_1.1-7
 Rcpp_0.11.2   Matrix_1.1-5  runjags_1.2.1-0   sm_2.2-5.4
 [9] foreign_0.8-63car_2.0-25

 loaded via a namespace (and not attached):
 [1] coda_0.16-1  colorspace_1.2-4 grid_3.1.3   MASS_7.3-39
 mgcv_1.8-4   

Re: [R] not a Stata version 5-12 .dta file

2015-03-19 Thread Nicole Ford
I am trying it now— it is downloading currently.  I will let you know of any 
success in the morning.Thanks!




 On Mar 20, 2015, at 12:09 AM, Anthony Damico ajdam...@gmail.com wrote:
 
 doesn't just running this solve your problem?
 
 https://github.com/ajdamico/usgsd/blob/master/World%20Values%20Survey/download%20all%20microdata.R
  
 https://github.com/ajdamico/usgsd/blob/master/World%20Values%20Survey/download%20all%20microdata.R
 
 
 On Fri, Mar 20, 2015 at 12:04 AM, Nicole Ford nicole.f...@me.com 
 mailto:nicole.f...@me.com wrote:
 Anthony,
 
 Thanks for this.  The issue I am having is WVS didn’t save all of their stata 
 files, it seems, as .dta.  Further, the .rdata files are not loading 
 correctly, either, giving me .Traceback or crashes R when I try to source it. 
  I will poke around your link to see if it can provide any insight.
 
 ~n
 
 
 
 
 
 
 
 On Mar 19, 2015, at 9:09 PM, Anthony Damico ajdam...@gmail.com 
 mailto:ajdam...@gmail.com wrote:
 
 hi nicole, i have published easy to reproduce, well-documented code to 
 download and then analyze every file from every wave of the world values 
 survey here.  the download automation script should solve your problem, or 
 at least work around it  :)
 
 http://www.asdfree.com/search/label/world%20values%20survey%20%28wvs%29 
 http://www.asdfree.com/search/label/world%20values%20survey%20%28wvs%29
 
 
 
 
 
 On Thu, Mar 19, 2015 at 6:09 PM, Nicole Ford nicole.f...@me.com 
 mailto:nicole.f...@me.com wrote:
 the text  didn’t send for the R data file erros.  sorry about that.
 
 
 2015-03-19 17:41:38.544 R[398:5728] Unable to simultaneously satisfy 
 constraints:
 (
 NSAutoresizingMaskLayoutConstraint:0x618966c0 h=-- v=-- 
 H:|-(0)-[NSView:0x6032da20]   (Names: '|':FIFinderView:0x6080003612c0 
 ),
 NSAutoresizingMaskLayoutConstraint:0x612881b0 h=-- v=-- 
 H:[NSView:0x6032da20]-(0)-|   (Names: '|':FIFinderView:0x6080003612c0 
 ),
 NSAutoresizingMaskLayoutConstraint:0x60a8c710 h=-- v=-- 
 H:|-(0)-[FIFinderView:0x6080003612c0]   (Names: 
 '|':NSNavFinderViewFileBrowser:0x608000375fc0 ),
 NSAutoresizingMaskLayoutConstraint:0x6128eb50 h=-- v=-- 
 H:[FIFinderView:0x6080003612c0]-(0)-|   (Names: 
 '|':NSNavFinderViewFileBrowser:0x608000375fc0 ),
 NSAutoresizingMaskLayoutConstraint:0x60c93fb0 h=-- v=-- 
 H:[NSNavFinderViewFileBrowser:0x608000375fc0(585)],
 NSLayoutConstraint:0x6149d740 H:|-(0)-[NSView:0x60133ec0]   
 (Names: '|':NSView:0x6032da20 ),
 NSLayoutConstraint:0x61489880 H:[NSView:0x60133ec0]-(0)-|   
 (Names: '|':NSView:0x6032da20 ),
 NSLayoutConstraint:0x6109e280 
 H:[FILocationPopUp:0x603fda00(207)],
 NSLayoutConstraint:0x60a82760 NSView:0x60133ec0.centerX == 
 FILocationPopUp:0x603fda00.centerX,
 NSLayoutConstraint:0x60e835c0 
 H:[FILocationPopUp:0x603fda00]-(=10)-[SGTSearchField:0x603bf800],
 NSLayoutConstraint:0x6069f2c0 
 H:[SGTSearchField:0x603bf800]-(11)-|   (Names: '|':NSView:0x60133ec0 
 ),
 NSLayoutConstraint:0x606801e0 
 H:[SGTSearchField:0x603bf800(=218)]
 )
 
 Will attempt to recover by breaking constraint
 NSLayoutConstraint:0x606801e0 H:[SGTSearchField:0x603bf800(=218)]
 
 Set the NSUserDefault 
 NSConstraintBasedLayoutVisualizeMutuallyExclusiveConstraints to YES to have 
 -[NSWindow visualizeConstraints:] automatically called when this happens.  
 And/or, break on objc_exception_throw to catch this in the debugger.
  str(dat)
  chr [1:2] .Traceback WV3_Data_rdata_v_2014_09_21
  ls(dat)
 Error in as.environment(pos) :
   no item called .Traceback on the search list
  dat
 [1] .Traceback  WV3_Data_rdata_v_2014_09_21
  sessionInfo()
 R version 3.1.3 (2015-03-09)
 Platform: x86_64-apple-darwin13.4.0 (64-bit)
 Running under: OS X 10.10.1 (Yosemite)
 
 locale:
 [1] en_US.UTF-8/en_US.UTF-8/en_US.UTF-8/C/en_US.UTF-8/en_US.UTF-8
 
 attached base packages:
 [1] stats graphics  grDevices utils datasets  methods   base
 
 other attached packages:
  [1] readstata13_0.5-3 effects_3.0-3 lattice_0.20-30   lme4_1.1-7
 Rcpp_0.11.2   Matrix_1.1-5  runjags_1.2.1-0   sm_2.2-5.4
  [9] foreign_0.8-63car_2.0-25
 
 loaded via a namespace (and not attached):
  [1] coda_0.16-1  colorspace_1.2-4 grid_3.1.3   MASS_7.3-39  
 mgcv_1.8-4   minqa_1.2.3  nlme_3.1-120 nloptr_1.0.0 
 nnet_7.3-9
 [10] parallel_3.1.3   pbkrtest_0.4-2   quantreg_5.11SparseM_1.6  
 splines_3.1.3tools_3.1.3
 
 
 
 
 
  On Mar 19, 2015, at 5:08 PM, Nicole Ford nicole.f...@me.com 
  mailto:nicole.f...@me.com wrote:
 
  Ista,
 
  I am pulling multiple countries and multiple waves, but here is one 
  country in one wave.  I know if I can get one to work, I can get them all 
  to work.  I have used WVS data in the past and never encountered any 
  issues, so I am at a loss here.  Thanks again!
 
  

[R] Problem with different proj4string that are actually identical

2015-03-19 Thread Hemery, Lenaig
Dear everybody
I am trying to run an Ecological Niche Factor Analysis (enfa) with the package 
adehabitatHS but before I do so, I want to test the significance of its 
parameters marginality and tolerance, by using the function niche.test() that 
runs a Monte Carlo test. I used to do that with the old package adehabitat 
that is now deprecated so I updated all my codes. Everything I want to do seems 
to work fine except the niche.test() function and I get the error message here 
below.

 testCro-niche.test(paramdf, spCro, nrep = 999, o.include = TRUE)
Error in join(pts, ta) : different proj4string in x and xy

I checked the proj4string for x (paramdf) and xy (spCro) and there are exactly 
identical (see below). 

 summary(spCro)
Object of class SpatialPoints
Coordinates:
  min max
longitude -124.91 -124.13
latitude39.86   46.95
Is projected: FALSE
proj4string :
[+proj=longlat +datum=WGS84 +ellps=WGS84 +towgs84=0,0,0]
Number of points: 84

 summary(paramdf)
Object of class SpatialPixelsDataFrame
Coordinates:
 min   max
x -125.5 -123.7998
y   39.50384   47.
Is projected: FALSE
proj4string :
[+proj=longlat +datum=WGS84 +ellps=WGS84 +towgs84=0,0,0]
Number of points: 108237
Grid attributes:
  cellcentre.offset cellsize cells.dim
x-125.49517  0.00966   176
y  39.50867  0.00966   776
Data attributes:
  bath  slope  rugo   sumT  
 Min.   :-3611.83   Min.   : 0.   Min.   :0.00   Min.   : 1.184 
 1st Qu.:-1885.11   1st Qu.: 0.5271   1st Qu.:0.008044   1st Qu.: 2.150 
 Median : -894.61   Median : 1.4974   Median :0.036921   Median : 3.978 
 Mean   :-1157.85   Mean   : 3.4237   Mean   :0.147369   Mean   : 4.794 
 3rd Qu.: -150.85   3rd Qu.: 4.1152   3rd Qu.:0.197974   3rd Qu.: 7.388 
 Max.   :   -0.05   Max.   :61.3592   Max.   :0.992856   Max.   :14.436 
[...]

I think I looked for all the help I could find on the internet and didn't find 
any solution so here is my last chance.
Does anybody have an idea on how to solve this problem?
By the way, I use the R version 3.1.3 and up-to-date adehabitatHS, ade4, 
sp and other packages.
Thanks a lot,
Lenaig

 )))° °((( 
Lenaïg Hemery, Ph. D.
Research Associate - post-doc
Hatfield Marine Science Center
Oregon State University
2030 S.E. Marine Science Drive, Newport, OR 97365, USA
Cell:+1-541-272-7196
__
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.

[R] no variable removal when running glmnet on diabetes dataset with alpha=1, lambda=.1

2015-03-19 Thread Feyerharm, Robert
New ZixCorp secure email message from ValueOptions Secure Email

To view the secure message, click on the link below or copy and paste the link 
into your Internet browser address bar.

https://securemail-valueoptions.com/s/e?m=ABC5UVsyBkxRSfS2UXb8k64pc=ABDfgFbxA3h2RUXHIPdWEiCwem=R%2dhelp%40r%2dproject%2eorg

You are reading the plaintext version of this message.  For a better user 
experience, change your email settings to enable the viewing of HTML.

Do not reply to this notification message; this message was auto-generated by 
the sender's security system. To reply to the sender, click on the link above.

The secure message expires on Sep 15, 2015 @ 08:04 PM (GMT).

Want to send and receive secure email messages transparently? 
http://www.zixcorp.com/info/zixmail_ZMC



[[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 provide commented, minimal, self-contained, reproducible code.


Re: [R] not a Stata version 5-12 .dta file

2015-03-19 Thread Nicole Ford
the text  didn’t send for the R data file erros.  sorry about that.


2015-03-19 17:41:38.544 R[398:5728] Unable to simultaneously satisfy 
constraints:
(
NSAutoresizingMaskLayoutConstraint:0x618966c0 h=-- v=-- 
H:|-(0)-[NSView:0x6032da20]   (Names: '|':FIFinderView:0x6080003612c0 ),
NSAutoresizingMaskLayoutConstraint:0x612881b0 h=-- v=-- 
H:[NSView:0x6032da20]-(0)-|   (Names: '|':FIFinderView:0x6080003612c0 ),
NSAutoresizingMaskLayoutConstraint:0x60a8c710 h=-- v=-- 
H:|-(0)-[FIFinderView:0x6080003612c0]   (Names: 
'|':NSNavFinderViewFileBrowser:0x608000375fc0 ),
NSAutoresizingMaskLayoutConstraint:0x6128eb50 h=-- v=-- 
H:[FIFinderView:0x6080003612c0]-(0)-|   (Names: 
'|':NSNavFinderViewFileBrowser:0x608000375fc0 ),
NSAutoresizingMaskLayoutConstraint:0x60c93fb0 h=-- v=-- 
H:[NSNavFinderViewFileBrowser:0x608000375fc0(585)],
NSLayoutConstraint:0x6149d740 H:|-(0)-[NSView:0x60133ec0]   
(Names: '|':NSView:0x6032da20 ),
NSLayoutConstraint:0x61489880 H:[NSView:0x60133ec0]-(0)-|   
(Names: '|':NSView:0x6032da20 ),
NSLayoutConstraint:0x6109e280 
H:[FILocationPopUp:0x603fda00(207)],
NSLayoutConstraint:0x60a82760 NSView:0x60133ec0.centerX == 
FILocationPopUp:0x603fda00.centerX,
NSLayoutConstraint:0x60e835c0 
H:[FILocationPopUp:0x603fda00]-(=10)-[SGTSearchField:0x603bf800],
NSLayoutConstraint:0x6069f2c0 
H:[SGTSearchField:0x603bf800]-(11)-|   (Names: '|':NSView:0x60133ec0 
),
NSLayoutConstraint:0x606801e0 
H:[SGTSearchField:0x603bf800(=218)]
)

Will attempt to recover by breaking constraint 
NSLayoutConstraint:0x606801e0 H:[SGTSearchField:0x603bf800(=218)]

Set the NSUserDefault 
NSConstraintBasedLayoutVisualizeMutuallyExclusiveConstraints to YES to have 
-[NSWindow visualizeConstraints:] automatically called when this happens.  
And/or, break on objc_exception_throw to catch this in the debugger.
 str(dat)
 chr [1:2] .Traceback WV3_Data_rdata_v_2014_09_21
 ls(dat)
Error in as.environment(pos) : 
  no item called .Traceback on the search list
 dat
[1] .Traceback  WV3_Data_rdata_v_2014_09_21
 sessionInfo()
R version 3.1.3 (2015-03-09)
Platform: x86_64-apple-darwin13.4.0 (64-bit)
Running under: OS X 10.10.1 (Yosemite)

locale:
[1] en_US.UTF-8/en_US.UTF-8/en_US.UTF-8/C/en_US.UTF-8/en_US.UTF-8

attached base packages:
[1] stats graphics  grDevices utils datasets  methods   base 

other attached packages:
 [1] readstata13_0.5-3 effects_3.0-3 lattice_0.20-30   lme4_1.1-7
Rcpp_0.11.2   Matrix_1.1-5  runjags_1.2.1-0   sm_2.2-5.4   
 [9] foreign_0.8-63car_2.0-25   

loaded via a namespace (and not attached):
 [1] coda_0.16-1  colorspace_1.2-4 grid_3.1.3   MASS_7.3-39  
mgcv_1.8-4   minqa_1.2.3  nlme_3.1-120 nloptr_1.0.0 nnet_7.3-9  

[10] parallel_3.1.3   pbkrtest_0.4-2   quantreg_5.11SparseM_1.6  
splines_3.1.3tools_3.1.3 
 




 On Mar 19, 2015, at 5:08 PM, Nicole Ford nicole.f...@me.com wrote:
 
 Ista,
 
 I am pulling multiple countries and multiple waves, but here is one country 
 in one wave.  I know if I can get one to work, I can get them all to work.  I 
 have used WVS data in the past and never encountered any issues, so I am at a 
 loss here.  Thanks again!
 
 http://www.worldvaluessurvey.org/WVSDocumentationWV3.jsp 
 http://www.worldvaluessurvey.org/WVSDocumentationWV3.jsp
 
 
 ~Nicole
 
 
 
 
 
 
 On Mar 19, 2015, at 4:59 PM, Ista Zahn istaz...@gmail.com 
 mailto:istaz...@gmail.com wrote:
 
 Is the file publicly available? What is the URL?
 
 Best,
 Ista
 
 On Thu, Mar 19, 2015 at 4:46 PM, Nicole Ford nicole.f...@me.com 
 mailto:nicole.f...@me.com wrote:
 Hello, Ista.
 
 Honestly, I am uncertain.  I don't have STATA -- I downloaded this from the 
 data source website.
 
 I can't imagine it is 13 because the data are old (2006).
 
 I tried package readstata13 out of desperation, but didn't think it would 
 resolve.
 
 Thanks for the suggestion!
 
 Sent from my iPhone
 
 On Mar 19, 2015, at 4:41 PM, Ista Zahn istaz...@gmail.com 
 mailto:istaz...@gmail.com wrote:
 
 Hi Nicole,
 
 Is it a stata 13 data file? If so your best bet is to open it in Stata
 and use the saveold command to save it as a stata 12 file.
 
 Best,
 Ista
 
 On Thu, Mar 19, 2015 at 3:00 PM, Nicole Ford nicole.f...@me.com 
 mailto:nicole.f...@me.com wrote:
 Hello,
 
 I recently updated to the newest version of R and I am encountering 
 issues.  Please find my error and session info below.  My data are 
 attached.  I have tried the readstata13 package just in case to no avail. 
  Unless I am missing something, google isn’t helping.
 
 
 
 Thank you in advance.
 
 
 
 error:
 dat - read.dta(file.choose())
 Error in read.dta(file.choose()) : not a Stata version 5-12 .dta file
 2015-03-19 14:14:21.445 R[398:5728] Unable to simultaneously satisfy 
 constraints:
 (
   

[R] remove outliers with scatterplotMatrix

2015-03-19 Thread Pagliari, Roberto
outliers may sometimes make a scatter plot less understandable.

when using scatterplotMatrix, is it possible to automatically remove them?


[[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 provide commented, minimal, self-contained, reproducible code.


[R] Multicollinearity, plm, and omitting variables

2015-03-19 Thread A. John Woodill
I'm fitting a fixed effect model with plm and know that I'm dealing with
multi-collinearity between two of the independent variables. I working on
identifying multicolliearity in models as a practice and have identified
the variable with alias(), then verified with vif(). I was also able to use
kappa() to show a very large conditional number verifying the
multicollinearity.

My question is why does plm() omit this multicolliearity variable from the
coefficients? There is no output clarifying why and I couldn't find
anything in the documentation. Stata automatically omits this variable and
I'm curious if plm() does a check and then omits.  Does plm() run through
checks when fitting a fixed effect model that checks for collinearity or
any other problems before running the model?  Why is dfmfd98 variable being
omitted in the example below?

Stack Exchange Post :
http://stats.stackexchange.com/questions/141684/multicollinearity-plm-and-omitting-variables

Multicollinearity variable dfmfd98

Reproducible example :

dput :

data - structure(list(lexptot = c(8.28377505197124, 9.1595012302023,
8.14707583238833,
9.86330744180814, 8.21391453619232, 8.92372556833205, 7.77219149815994,
8.58202430280175, 8.34096828565733, 10.1133857229336, 8.56482997492403,
8.09468633074053, 8.27040804817704, 8.69834992618814, 8.03086333985764,
8.89644392254136, 8.20990433577082, 8.82621293136669, 7.79379981225575,
8.16139809188569, 8.25549748271241, 8.57464947213076, 8.2714431846277,
8.72374048671495, 7.98522888221012, 8.56460042433047, 8.22778847721461,
9.15431416391622, 8.25261818916933, 8.88033778695326), year = c(0L, 1L, 0L,
1L, 0L, 1L, 0L, 1L, 0L, 1L, 0L, 1L, 0L, 1L, 0L, 1L, 0L, 1L, 0L, 1L, 0L, 1L,
0L, 1L, 0L, 1L, 0L, 1L, 0L, 1L), dfmfdyr = c(0, 1, 0, 1, 0, 1, 0, 1, 0, 1,
0, 0, 0, 0, 0, 0, 0, 1, 0, 1, 0, 1, 0, 1, 0, 1, 0, 0, 0, 0), dfmfd98 = c(1, 1,
1, 1, 1, 1, 1, 1, 1, 1, 0, 0, 0, 0, 0, 0, 1, 1, 1, 1, 1, 1, 1, 1, 1, 1, 0,
0, 0, 0), nh = c(11054L, 11054L, 11061L, 11061L, 11081L, 11081L, 11101L,
11101L, 12021L, 12021L, 12035L, 12035L, 12051L, 12051L, 12054L, 12054L,
12081L, 12081L, 12121L, 12121L, 13014L, 13014L, 13015L, 13015L, 13021L,
13021L, 13025L, 13025L, 13035L, 13035L)), .Names = c(lexptot, year,
dfmfdyr, dfmfd98, nh), class = c(tbl_df, data.frame), row.names =
c(NA, -30L))

Regression Code :

library(plm)

lm - plm(lexptot ~ year + dfmfdyr + dfmfd98 + nh, data = data, model =
within, index = nh)

summary(lm)

Output :

Oneway (individual) effect Within Model

Call:

plm(formula = lexptot ~ year + dfmfdyr + dfmfd98 + nh, data = data,

model = within, index = nh)

Balanced Panel: n=15, T=2, N=30

Residuals :

 Min.   1st Qu.Median   3rd Qu.  Max.

-4.75e-01 -1.69e-01  4.44e-16  1.69e-01  4.75e-01

Coefficients :

Estimate Std. Error t-value Pr(|t|)

year 0.475520.23830  1.9955  0.06738 .

dfmfdyr  0.346350.29185  1.1867  0.25657

---

Signif. codes:  0 ‘***’ 0.001 ‘**’ 0.01 ‘*’ 0.05 ‘.’ 0.1 ‘ ’ 1

Total Sum of Squares:5.7882

Residual Sum of Squares: 1.8455

R-Squared  :  0.68116

  Adj. R-Squared :  0.29517

F-statistic: 13.8864 on 2 and 13 DF, p-value: 0.00059322

[[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 provide commented, minimal, self-contained, reproducible code.

[R] Use BatchJobs package to submit Rmpi job

2015-03-19 Thread Feng Li
Hi,
BatchJobs package is popular to submit R batch jobs on various job scheduler. 
Now we are facing the question is to submit a Rmpi jobs. So we want to know how 
we can leverage BatchJobs to do so. After a bit investigation/enhancement, we 
tested below approach on OpenLava job scheduler. we want to get some inputs 
from the group to see how this makes sense to you. thanks,

1. R script that submit a Rmpi job using BatchJobs:
library(BatchJobs)
conf = BatchJobs:::getBatchJobsConf()
conf$cluster.functions = 
makeClusterFunctionsOpenLava(/home/clusteradmin/rmpi.tmpl)  -- specify 
job template file that includes mpirun to start R job.
reg = makeRegistry(id = RMPIJobsExample)
f = function(x) {-- RMPI 
algorithm function. This is the normal Rmpi R script.
library(Rmpi)
...
mpi.spawn.Rslaves(nslaves=slaveno)
...
mpi.remote.exec(paste(I 
am,mpi.comm.rank(),of,mpi.comm.size()))
...
}
batchMap(reg, f, 1)   -- specify 1 Rmpi job
submitJobs(reg, np=2)  -- specify number of 
processors to use
showStatus(reg)
waitForJobs(reg)
showStatus(reg)

2. the job template: rmpi.tmpl
#BSUB -q mpi_job_queue
/opt/openlava/bin/openmpi-mpirun 
-np 1 R CMD BATCH %= rscript %


Please let us know your comments,

Thanks,
Feng Li
Teraproc Inc.


[[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 provide commented, minimal, self-contained, reproducible code.


Re: [R] remove outliers with scatterplotMatrix

2015-03-19 Thread John Fox
Dear Roberto,

This is, I assume, the scatterplotMatrix() function in the car package.

There is no option for automatically removing outliers, although the various
options for labeling points should help you identify them. If you want to
remove outliers once identified, you could use the subset argument to
scatterplotMatrix(), much as you would for a statistical modeling function,
as long as the variables in the scatterplot matrix are specified in a
formula. 

For example,

scatterplotMatrix(~ income + education + prestige, data=Duncan,
id.n=2)

identifies the two most noteworthy points in each panel (as explained in
?scatterplotMatrix), while

scatterplotMatrix(~ income + education + prestige, data=Duncan,
subset= -c(6, 16))

removes cases 6 and 16.

I hope this helps,
 John

---
John Fox, Professor
McMaster University
Hamilton, Ontario, Canada
http://socserv.mcmaster.ca/jfox/




 -Original Message-
 From: R-help [mailto:r-help-boun...@r-project.org] On Behalf Of Pagliari,
 Roberto
 Sent: March-19-15 11:07 AM
 To: r-help@r-project.org
 Subject: [R] remove outliers with scatterplotMatrix
 
 outliers may sometimes make a scatter plot less understandable.
 
 when using scatterplotMatrix, is it possible to automatically remove them?
 
 
   [[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 provide commented, minimal, self-contained, reproducible code.


---
This email has been checked for viruses by Avast antivirus software.
http://www.avast.com

__
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.


Re: [R] Which is better: Modifying an existing package or creating a new one?

2015-03-19 Thread billy am
I would second that.

--
|

http://billyam.com  || http://use-r.com  || http://shinyserver.com (BETA)

SAS Certified Base Programmer for SAS 9
Oracle SQL Expert(11g)



On Thu, Mar 19, 2015 at 4:39 PM, Thierry Onkelinx
thierry.onkel...@inbo.be wrote:
 I would consider a third option: suggest the changes to the package
 authors. The authors might include your modifications to the original
 package if they feel that it would improve their package.

 Otherwise go for option 2. Option 1 will be harder to maintain if you want
 benefit from the updates on the packages A, B, C, D, E.

 Best regards,

 ir. Thierry Onkelinx
 Instituut voor natuur- en bosonderzoek / Research Institute for Nature and
 Forest
 team Biometrie  Kwaliteitszorg / team Biometrics  Quality Assurance
 Kliniekstraat 25
 1070 Anderlecht
 Belgium

 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 say
 what the experiment died of. ~ Sir Ronald Aylmer Fisher
 The plural of anecdote is not data. ~ Roger Brinner
 The combination of some data and an aching desire for an answer does not
 ensure that a reasonable answer can be extracted from a given body of data.
 ~ John Tukey

 2015-03-19 8:56 GMT+01:00 jpm miao miao...@gmail.com:

 Hi,

Given that I frequently use A, B, C, D, E packages.
In each of the 5 packages, I intend to modify one of the functions.
Two ways:

 1st: Modify A, B, C, D, E to A', B', C', D', E'
Then I will use library(A') . library(E') instead of A, B, C, D, E.
or Just keep the names A, B, C, D, E but modify the content

 2nd: create a package F and add the five functions to the F package. For
 each of the 5 functions, a line library(A)... or library(E) is
 required.

 Then I will need library(F) when I create a new program.

Which is a better way in terms of time consumption and code portability?
 If I move the codes to a new computer, which way will be easier?

Any suggestion?

Thanks,

 Miao

 [[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 provide commented, minimal, self-contained, reproducible code.


 [[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 provide commented, minimal, self-contained, reproducible code.

__
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.


[R] Why do my posts not get accepted to the mailing list?

2015-03-19 Thread andrejfavia
Greetings.
I was told to email my question.

Why do my posts not get accepted to the mailing list?

Example:
http://r.789695.n4.nabble.com/How-do-I-move-the-horizontal-axis-in-a-plot-so-that-it-starts-at-the-zero-of-the-vertical-axis-td4696935.html

I don't understand why I always have this problem when I post and try to
subscribe and I still haven't found a solution after three years.

__
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.


[R] not a Stata version 5-12 .dta file

2015-03-19 Thread Nicole Ford
Hello,

I recently updated to the newest version of R and I am encountering issues.  
Please find my error and session info below.  My data are attached.  I have 
tried the readstata13 package just in case to no avail.  Unless I am missing 
something, google isn’t helping.



Thank you in advance.



error:
 dat - read.dta(file.choose())
Error in read.dta(file.choose()) : not a Stata version 5-12 .dta file
2015-03-19 14:14:21.445 R[398:5728] Unable to simultaneously satisfy 
constraints:
(
NSAutoresizingMaskLayoutConstraint:0x608000490bd0 h=-- v=-- 
H:|-(0)-[NSView:0x6012eba0]   (Names: '|':FIFinderView:0x60363a80 ),
NSAutoresizingMaskLayoutConstraint:0x608000490e50 h=-- v=-- 
H:[NSView:0x6012eba0]-(0)-|   (Names: '|':FIFinderView:0x60363a80 ),
NSAutoresizingMaskLayoutConstraint:0x608000491120 h=-- v=-- 
H:|-(0)-[FIFinderView:0x60363a80]   (Names: 
'|':NSNavFinderViewFileBrowser:0x608000377400 ),
NSAutoresizingMaskLayoutConstraint:0x608000491170 h=-- v=-- 
H:[FIFinderView:0x60363a80]-(0)-|   (Names: 
'|':NSNavFinderViewFileBrowser:0x608000377400 ),
NSAutoresizingMaskLayoutConstraint:0x608000491350 h=-- v=-- 
H:[NSNavFinderViewFileBrowser:0x608000377400(585)],
NSLayoutConstraint:0x60482d50 H:|-(0)-[NSView:0x6012e380]   
(Names: '|':NSView:0x6012eba0 ),
NSLayoutConstraint:0x60482da0 H:[NSView:0x6012e380]-(0)-|   
(Names: '|':NSView:0x6012eba0 ),
NSLayoutConstraint:0x604816d0 
H:[FILocationPopUp:0x601f2800(207)],
NSLayoutConstraint:0x60482a30 NSView:0x6012e380.centerX == 
FILocationPopUp:0x601f2800.centerX,
NSLayoutConstraint:0x604825d0 
H:[FILocationPopUp:0x601f2800]-(=10)-[SGTSearchField:0x603a5160],
NSLayoutConstraint:0x60482b70 
H:[SGTSearchField:0x603a5160]-(11)-|   (Names: '|':NSView:0x6012e380 
),
NSLayoutConstraint:0x604814f0 
H:[SGTSearchField:0x603a5160(=218)]
)

Will attempt to recover by breaking constraint 
NSLayoutConstraint:0x604814f0 H:[SGTSearchField:0x603a5160(=218)]

Set the NSUserDefault 
NSConstraintBasedLayoutVisualizeMutuallyExclusiveConstraints to YES to have 
-[NSWindow visualizeConstraints:] automatically called when this happens.  
And/or, break on objc_exception_throw to catch this in the debugger.
 sessionInfo()

Session Info:
R version 3.1.3 (2015-03-09)
Platform: x86_64-apple-darwin13.4.0 (64-bit)
Running under: OS X 10.10.1 (Yosemite)

locale:
[1] en_US.UTF-8/en_US.UTF-8/en_US.UTF-8/C/en_US.UTF-8/en_US.UTF-8

attached base packages:
[1] stats graphics  grDevices utils datasets  methods   base 

other attached packages:
[1] effects_3.0-3   lattice_0.20-30 lme4_1.1-7  Rcpp_0.11.2 
Matrix_1.1-5runjags_1.2.1-0 sm_2.2-5.4  foreign_0.8-63  car_2.0-25 

loaded via a namespace (and not attached):
 [1] coda_0.16-1  colorspace_1.2-4 grid_3.1.3   MASS_7.3-39  
mgcv_1.8-4   minqa_1.2.3  nlme_3.1-120 nloptr_1.0.0 nnet_7.3-9  

[10] parallel_3.1.3   pbkrtest_0.4-2   quantreg_5.11SparseM_1.6  
splines_3.1.3tools_3.1.3  

~n






__
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.

[R] not a Stata version 5-12 .dta file

2015-03-19 Thread Nicole Ford
Hello,

I recently updated to the newest version of R and I am encountering issues.  
Please find my error and session info below.  My data are attached.  I have 
tried the readstata13 package just in case to no avail.  Unless I am missing 
something, google isn’t helping.



Thank you in advance.



error:
 dat - read.dta(file.choose())
Error in read.dta(file.choose()) : not a Stata version 5-12 .dta file
2015-03-19 14:14:21.445 R[398:5728] Unable to simultaneously satisfy 
constraints:
(
NSAutoresizingMaskLayoutConstraint:0x608000490bd0 h=-- v=-- 
H:|-(0)-[NSView:0x6012eba0]   (Names: '|':FIFinderView:0x60363a80 ),
NSAutoresizingMaskLayoutConstraint:0x608000490e50 h=-- v=-- 
H:[NSView:0x6012eba0]-(0)-|   (Names: '|':FIFinderView:0x60363a80 ),
NSAutoresizingMaskLayoutConstraint:0x608000491120 h=-- v=-- 
H:|-(0)-[FIFinderView:0x60363a80]   (Names: 
'|':NSNavFinderViewFileBrowser:0x608000377400 ),
NSAutoresizingMaskLayoutConstraint:0x608000491170 h=-- v=-- 
H:[FIFinderView:0x60363a80]-(0)-|   (Names: 
'|':NSNavFinderViewFileBrowser:0x608000377400 ),
NSAutoresizingMaskLayoutConstraint:0x608000491350 h=-- v=-- 
H:[NSNavFinderViewFileBrowser:0x608000377400(585)],
NSLayoutConstraint:0x60482d50 H:|-(0)-[NSView:0x6012e380]   
(Names: '|':NSView:0x6012eba0 ),
NSLayoutConstraint:0x60482da0 H:[NSView:0x6012e380]-(0)-|   
(Names: '|':NSView:0x6012eba0 ),
NSLayoutConstraint:0x604816d0 
H:[FILocationPopUp:0x601f2800(207)],
NSLayoutConstraint:0x60482a30 NSView:0x6012e380.centerX == 
FILocationPopUp:0x601f2800.centerX,
NSLayoutConstraint:0x604825d0 
H:[FILocationPopUp:0x601f2800]-(=10)-[SGTSearchField:0x603a5160],
NSLayoutConstraint:0x60482b70 
H:[SGTSearchField:0x603a5160]-(11)-|   (Names: '|':NSView:0x6012e380 
),
NSLayoutConstraint:0x604814f0 
H:[SGTSearchField:0x603a5160(=218)]
)

Will attempt to recover by breaking constraint 
NSLayoutConstraint:0x604814f0 H:[SGTSearchField:0x603a5160(=218)]

Set the NSUserDefault 
NSConstraintBasedLayoutVisualizeMutuallyExclusiveConstraints to YES to have 
-[NSWindow visualizeConstraints:] automatically called when this happens.  
And/or, break on objc_exception_throw to catch this in the debugger.
 sessionInfo()

Session Info:
R version 3.1.3 (2015-03-09)
Platform: x86_64-apple-darwin13.4.0 (64-bit)
Running under: OS X 10.10.1 (Yosemite)

locale:
[1] en_US.UTF-8/en_US.UTF-8/en_US.UTF-8/C/en_US.UTF-8/en_US.UTF-8

attached base packages:
[1] stats graphics  grDevices utils datasets  methods   base 

other attached packages:
[1] effects_3.0-3   lattice_0.20-30 lme4_1.1-7  Rcpp_0.11.2 
Matrix_1.1-5runjags_1.2.1-0 sm_2.2-5.4  foreign_0.8-63  car_2.0-25 

loaded via a namespace (and not attached):
 [1] coda_0.16-1  colorspace_1.2-4 grid_3.1.3   MASS_7.3-39  
mgcv_1.8-4   minqa_1.2.3  nlme_3.1-120 nloptr_1.0.0 nnet_7.3-9  

[10] parallel_3.1.3   pbkrtest_0.4-2   quantreg_5.11SparseM_1.6  
splines_3.1.3tools_3.1.3  

~n






__
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.

Re: [R] remove outliers with scatterplotMatrix

2015-03-19 Thread Pagliari, Roberto
Thank you John,
I will try that one. 

Bob, 


From: John Fox [j...@mcmaster.ca]
Sent: Thursday, March 19, 2015 2:08 PM
To: Pagliari, Roberto
Cc: r-help@r-project.org
Subject: RE: [R] remove outliers with scatterplotMatrix

Dear Roberto,

This is, I assume, the scatterplotMatrix() function in the car package.

There is no option for automatically removing outliers, although the various
options for labeling points should help you identify them. If you want to
remove outliers once identified, you could use the subset argument to
scatterplotMatrix(), much as you would for a statistical modeling function,
as long as the variables in the scatterplot matrix are specified in a
formula.

For example,

scatterplotMatrix(~ income + education + prestige, data=Duncan,
id.n=2)

identifies the two most noteworthy points in each panel (as explained in
?scatterplotMatrix), while

scatterplotMatrix(~ income + education + prestige, data=Duncan,
subset= -c(6, 16))

removes cases 6 and 16.

I hope this helps,
 John

---
John Fox, Professor
McMaster University
Hamilton, Ontario, Canada
http://socserv.mcmaster.ca/jfox/




 -Original Message-
 From: R-help [mailto:r-help-boun...@r-project.org] On Behalf Of Pagliari,
 Roberto
 Sent: March-19-15 11:07 AM
 To: r-help@r-project.org
 Subject: [R] remove outliers with scatterplotMatrix

 outliers may sometimes make a scatter plot less understandable.

 when using scatterplotMatrix, is it possible to automatically remove them?


   [[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 provide commented, minimal, self-contained, reproducible code.


---
This email has been checked for viruses by Avast antivirus software.
http://www.avast.com


__
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.


Re: [R] Why do my posts not get accepted to the mailing list?

2015-03-19 Thread Duncan Murdoch

On 19/03/2015 2:26 PM, andrejfa...@ml1.net wrote:

Greetings.
I was told to email my question.

Why do my posts not get accepted to the mailing list?

Example:
http://r.789695.n4.nabble.com/How-do-I-move-the-horizontal-axis-in-a-plot-so-that-it-starts-at-the-zero-of-the-vertical-axis-td4696935.html

I don't understand why I always have this problem when I post and try to
subscribe and I still haven't found a solution after three years.


This post *did* appear on the mailing list.  Do what you just did.

I would not have seen your earlier posts, because I don't read posts 
from nabble; perhaps they are now banned completely.


Duncan Murdoch

__
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.


Re: [R] remove outliers with scatterplotMatrix

2015-03-19 Thread David Winsemius

On Mar 19, 2015, at 8:06 AM, Pagliari, Roberto wrote:

 outliers may sometimes make a scatter plot less understandable.
 
 when using scatterplotMatrix, is it possible to automatically remove them?

I've known people who set values to NA that are outside some predefined 
threshold such as less than the .05th percentile (the .0005th quantile) and the 
99.95th percentile at the high end. I'm not so eager to erase values at 
either end, but there would be automated ways of doing that on a copy of the 
data. Post a better description of the data problem.
 
 
   [[alternative HTML version deleted]]

And learn to configure your email client to post in plain text. and read the 
material mentioned below.

 
 __
 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.

David Winsemius
Alameda, CA, USA

__
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.


Re: [R] not a Stata version 5-12 .dta file

2015-03-19 Thread Nicole Ford
Hello, Ista.  

Honestly, I am uncertain.  I don't have STATA -- I downloaded this from the 
data source website.

I can't imagine it is 13 because the data are old (2006).  

I tried package readstata13 out of desperation, but didn't think it would 
resolve.

Thanks for the suggestion!

Sent from my iPhone

 On Mar 19, 2015, at 4:41 PM, Ista Zahn istaz...@gmail.com wrote:
 
 Hi Nicole,
 
 Is it a stata 13 data file? If so your best bet is to open it in Stata
 and use the saveold command to save it as a stata 12 file.
 
 Best,
 Ista
 
 On Thu, Mar 19, 2015 at 3:00 PM, Nicole Ford nicole.f...@me.com wrote:
 Hello,
 
 I recently updated to the newest version of R and I am encountering issues.  
 Please find my error and session info below.  My data are attached.  I have 
 tried the readstata13 package just in case to no avail.  Unless I am missing 
 something, google isn’t helping.
 
 
 
 Thank you in advance.
 
 
 
 error:
 dat - read.dta(file.choose())
 Error in read.dta(file.choose()) : not a Stata version 5-12 .dta file
 2015-03-19 14:14:21.445 R[398:5728] Unable to simultaneously satisfy 
 constraints:
 (
NSAutoresizingMaskLayoutConstraint:0x608000490bd0 h=-- v=-- 
 H:|-(0)-[NSView:0x6012eba0]   (Names: '|':FIFinderView:0x60363a80 
 ),
NSAutoresizingMaskLayoutConstraint:0x608000490e50 h=-- v=-- 
 H:[NSView:0x6012eba0]-(0)-|   (Names: '|':FIFinderView:0x60363a80 
 ),
NSAutoresizingMaskLayoutConstraint:0x608000491120 h=-- v=-- 
 H:|-(0)-[FIFinderView:0x60363a80]   (Names: 
 '|':NSNavFinderViewFileBrowser:0x608000377400 ),
NSAutoresizingMaskLayoutConstraint:0x608000491170 h=-- v=-- 
 H:[FIFinderView:0x60363a80]-(0)-|   (Names: 
 '|':NSNavFinderViewFileBrowser:0x608000377400 ),
NSAutoresizingMaskLayoutConstraint:0x608000491350 h=-- v=-- 
 H:[NSNavFinderViewFileBrowser:0x608000377400(585)],
NSLayoutConstraint:0x60482d50 H:|-(0)-[NSView:0x6012e380]   
 (Names: '|':NSView:0x6012eba0 ),
NSLayoutConstraint:0x60482da0 H:[NSView:0x6012e380]-(0)-|   
 (Names: '|':NSView:0x6012eba0 ),
NSLayoutConstraint:0x604816d0 
 H:[FILocationPopUp:0x601f2800(207)],
NSLayoutConstraint:0x60482a30 NSView:0x6012e380.centerX == 
 FILocationPopUp:0x601f2800.centerX,
NSLayoutConstraint:0x604825d0 
 H:[FILocationPopUp:0x601f2800]-(=10)-[SGTSearchField:0x603a5160],
NSLayoutConstraint:0x60482b70 
 H:[SGTSearchField:0x603a5160]-(11)-|   (Names: '|':NSView:0x6012e380 
 ),
NSLayoutConstraint:0x604814f0 
 H:[SGTSearchField:0x603a5160(=218)]
 )
 
 Will attempt to recover by breaking constraint
 NSLayoutConstraint:0x604814f0 H:[SGTSearchField:0x603a5160(=218)]
 
 Set the NSUserDefault 
 NSConstraintBasedLayoutVisualizeMutuallyExclusiveConstraints to YES to have 
 -[NSWindow visualizeConstraints:] automatically called when this happens.  
 And/or, break on objc_exception_throw to catch this in the debugger.
 sessionInfo()
 
 Session Info:
 R version 3.1.3 (2015-03-09)
 Platform: x86_64-apple-darwin13.4.0 (64-bit)
 Running under: OS X 10.10.1 (Yosemite)
 
 locale:
 [1] en_US.UTF-8/en_US.UTF-8/en_US.UTF-8/C/en_US.UTF-8/en_US.UTF-8
 
 attached base packages:
 [1] stats graphics  grDevices utils datasets  methods   base
 
 other attached packages:
 [1] effects_3.0-3   lattice_0.20-30 lme4_1.1-7  Rcpp_0.11.2 
 Matrix_1.1-5runjags_1.2.1-0 sm_2.2-5.4  foreign_0.8-63  car_2.0-25
 
 loaded via a namespace (and not attached):
 [1] coda_0.16-1  colorspace_1.2-4 grid_3.1.3   MASS_7.3-39  
 mgcv_1.8-4   minqa_1.2.3  nlme_3.1-120 nloptr_1.0.0 
 nnet_7.3-9
 [10] parallel_3.1.3   pbkrtest_0.4-2   quantreg_5.11SparseM_1.6  
 splines_3.1.3tools_3.1.3
 
 ~n
 
 
 
 
 
 
 __
 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.

__
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.

Re: [R] not a Stata version 5-12 .dta file

2015-03-19 Thread Nicole Ford
Ista,

I am pulling multiple countries and multiple waves, but here is one country in 
one wave.  I know if I can get one to work, I can get them all to work.  I have 
used WVS data in the past and never encountered any issues, so I am at a loss 
here.  Thanks again!

http://www.worldvaluessurvey.org/WVSDocumentationWV3.jsp 
http://www.worldvaluessurvey.org/WVSDocumentationWV3.jsp


~Nicole






 On Mar 19, 2015, at 4:59 PM, Ista Zahn istaz...@gmail.com wrote:
 
 Is the file publicly available? What is the URL?
 
 Best,
 Ista
 
 On Thu, Mar 19, 2015 at 4:46 PM, Nicole Ford nicole.f...@me.com wrote:
 Hello, Ista.
 
 Honestly, I am uncertain.  I don't have STATA -- I downloaded this from the 
 data source website.
 
 I can't imagine it is 13 because the data are old (2006).
 
 I tried package readstata13 out of desperation, but didn't think it would 
 resolve.
 
 Thanks for the suggestion!
 
 Sent from my iPhone
 
 On Mar 19, 2015, at 4:41 PM, Ista Zahn istaz...@gmail.com wrote:
 
 Hi Nicole,
 
 Is it a stata 13 data file? If so your best bet is to open it in Stata
 and use the saveold command to save it as a stata 12 file.
 
 Best,
 Ista
 
 On Thu, Mar 19, 2015 at 3:00 PM, Nicole Ford nicole.f...@me.com wrote:
 Hello,
 
 I recently updated to the newest version of R and I am encountering 
 issues.  Please find my error and session info below.  My data are 
 attached.  I have tried the readstata13 package just in case to no avail.  
 Unless I am missing something, google isn’t helping.
 
 
 
 Thank you in advance.
 
 
 
 error:
 dat - read.dta(file.choose())
 Error in read.dta(file.choose()) : not a Stata version 5-12 .dta file
 2015-03-19 14:14:21.445 R[398:5728] Unable to simultaneously satisfy 
 constraints:
 (
   NSAutoresizingMaskLayoutConstraint:0x608000490bd0 h=-- v=-- 
 H:|-(0)-[NSView:0x6012eba0]   (Names: '|':FIFinderView:0x60363a80 
 ),
   NSAutoresizingMaskLayoutConstraint:0x608000490e50 h=-- v=-- 
 H:[NSView:0x6012eba0]-(0)-|   (Names: '|':FIFinderView:0x60363a80 
 ),
   NSAutoresizingMaskLayoutConstraint:0x608000491120 h=-- v=-- 
 H:|-(0)-[FIFinderView:0x60363a80]   (Names: 
 '|':NSNavFinderViewFileBrowser:0x608000377400 ),
   NSAutoresizingMaskLayoutConstraint:0x608000491170 h=-- v=-- 
 H:[FIFinderView:0x60363a80]-(0)-|   (Names: 
 '|':NSNavFinderViewFileBrowser:0x608000377400 ),
   NSAutoresizingMaskLayoutConstraint:0x608000491350 h=-- v=-- 
 H:[NSNavFinderViewFileBrowser:0x608000377400(585)],
   NSLayoutConstraint:0x60482d50 H:|-(0)-[NSView:0x6012e380]   
 (Names: '|':NSView:0x6012eba0 ),
   NSLayoutConstraint:0x60482da0 H:[NSView:0x6012e380]-(0)-|   
 (Names: '|':NSView:0x6012eba0 ),
   NSLayoutConstraint:0x604816d0 
 H:[FILocationPopUp:0x601f2800(207)],
   NSLayoutConstraint:0x60482a30 NSView:0x6012e380.centerX == 
 FILocationPopUp:0x601f2800.centerX,
   NSLayoutConstraint:0x604825d0 
 H:[FILocationPopUp:0x601f2800]-(=10)-[SGTSearchField:0x603a5160],
   NSLayoutConstraint:0x60482b70 
 H:[SGTSearchField:0x603a5160]-(11)-|   (Names: 
 '|':NSView:0x6012e380 ),
   NSLayoutConstraint:0x604814f0 
 H:[SGTSearchField:0x603a5160(=218)]
 )
 
 Will attempt to recover by breaking constraint
 NSLayoutConstraint:0x604814f0 
 H:[SGTSearchField:0x603a5160(=218)]
 
 Set the NSUserDefault 
 NSConstraintBasedLayoutVisualizeMutuallyExclusiveConstraints to YES to 
 have -[NSWindow visualizeConstraints:] automatically called when this 
 happens.  And/or, break on objc_exception_throw to catch this in the 
 debugger.
 sessionInfo()
 
 Session Info:
 R version 3.1.3 (2015-03-09)
 Platform: x86_64-apple-darwin13.4.0 (64-bit)
 Running under: OS X 10.10.1 (Yosemite)
 
 locale:
 [1] en_US.UTF-8/en_US.UTF-8/en_US.UTF-8/C/en_US.UTF-8/en_US.UTF-8
 
 attached base packages:
 [1] stats graphics  grDevices utils datasets  methods   base
 
 other attached packages:
 [1] effects_3.0-3   lattice_0.20-30 lme4_1.1-7  Rcpp_0.11.2 
 Matrix_1.1-5runjags_1.2.1-0 sm_2.2-5.4  foreign_0.8-63  car_2.0-25
 
 loaded via a namespace (and not attached):
 [1] coda_0.16-1  colorspace_1.2-4 grid_3.1.3   MASS_7.3-39  
 mgcv_1.8-4   minqa_1.2.3  nlme_3.1-120 nloptr_1.0.0 
 nnet_7.3-9
 [10] parallel_3.1.3   pbkrtest_0.4-2   quantreg_5.11SparseM_1.6  
 splines_3.1.3tools_3.1.3
 
 ~n
 
 
 
 
 
 
 __
 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.


[[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

Re: [R] Tele_R - first experiences

2015-03-19 Thread Ista Zahn
Hey that's really nice. I'm not sure how practical it is, but it works
surprisingly well.

Best,
Ista

On Thu, Mar 19, 2015 at 8:21 AM, Dr. Wolfgang Lindner
lindn...@t-online.de wrote:
 Dear R community,

 some days ago Enric Cervera Mateu has installed an R client
 with instant messaging, which is usable very simple via the
 public name @Tele_R in the messenger Telegram.

 I have tested Tele_R and e.g. tried most of the examples from
 [1] W.N. Venables, D.M. Smith, R Core Team. An Introduction to R. R Core
 Team. iBooks.
 and of §1 of
 [2] B. Everitt, T. Hothorn. An R and S-plus Companion to Multivariate
 Analysis. Springer.
 All is working very good in this environment.

 I am very impressed. I like the possibility to use R without installation
 complications with my iPhone, iPad or HTC One.
 The answers are send very fast, the idea to use a chat for mathematics
 communication seems to be especially suited to beginners:
 direct dive in, OS as you like, working anywhere, talking over distance,
 communicate with your peers or students (share code or
 examples etc even during a lesson - if a beamer is not available) etc.

 I would like to thank Enric for his valuable work to make the great work of
 the R team accessible to smartphones and tablets.
 I think that Tele_R is a very comfortable tool for teaching and learning R
 at an undergraduate level.

 And I would like to hear about the experiences, opinions or ideas of other
 members of the R community with respect of the use of Tele_R.

 I hope that this is not the wrong list to say these words.

 Best,
 Wolfgang Lindner
 Leichlingen, Germany

 __
 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.

__
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.

Re: [R] not a Stata version 5-12 .dta file

2015-03-19 Thread Ista Zahn
Is the file publicly available? What is the URL?

Best,
Ista

On Thu, Mar 19, 2015 at 4:46 PM, Nicole Ford nicole.f...@me.com wrote:
 Hello, Ista.

 Honestly, I am uncertain.  I don't have STATA -- I downloaded this from the 
 data source website.

 I can't imagine it is 13 because the data are old (2006).

 I tried package readstata13 out of desperation, but didn't think it would 
 resolve.

 Thanks for the suggestion!

 Sent from my iPhone

 On Mar 19, 2015, at 4:41 PM, Ista Zahn istaz...@gmail.com wrote:

 Hi Nicole,

 Is it a stata 13 data file? If so your best bet is to open it in Stata
 and use the saveold command to save it as a stata 12 file.

 Best,
 Ista

 On Thu, Mar 19, 2015 at 3:00 PM, Nicole Ford nicole.f...@me.com wrote:
 Hello,

 I recently updated to the newest version of R and I am encountering issues. 
  Please find my error and session info below.  My data are attached.  I 
 have tried the readstata13 package just in case to no avail.  Unless I am 
 missing something, google isn’t helping.



 Thank you in advance.



 error:
 dat - read.dta(file.choose())
 Error in read.dta(file.choose()) : not a Stata version 5-12 .dta file
 2015-03-19 14:14:21.445 R[398:5728] Unable to simultaneously satisfy 
 constraints:
 (
NSAutoresizingMaskLayoutConstraint:0x608000490bd0 h=-- v=-- 
 H:|-(0)-[NSView:0x6012eba0]   (Names: '|':FIFinderView:0x60363a80 
 ),
NSAutoresizingMaskLayoutConstraint:0x608000490e50 h=-- v=-- 
 H:[NSView:0x6012eba0]-(0)-|   (Names: '|':FIFinderView:0x60363a80 
 ),
NSAutoresizingMaskLayoutConstraint:0x608000491120 h=-- v=-- 
 H:|-(0)-[FIFinderView:0x60363a80]   (Names: 
 '|':NSNavFinderViewFileBrowser:0x608000377400 ),
NSAutoresizingMaskLayoutConstraint:0x608000491170 h=-- v=-- 
 H:[FIFinderView:0x60363a80]-(0)-|   (Names: 
 '|':NSNavFinderViewFileBrowser:0x608000377400 ),
NSAutoresizingMaskLayoutConstraint:0x608000491350 h=-- v=-- 
 H:[NSNavFinderViewFileBrowser:0x608000377400(585)],
NSLayoutConstraint:0x60482d50 H:|-(0)-[NSView:0x6012e380]   
 (Names: '|':NSView:0x6012eba0 ),
NSLayoutConstraint:0x60482da0 H:[NSView:0x6012e380]-(0)-|   
 (Names: '|':NSView:0x6012eba0 ),
NSLayoutConstraint:0x604816d0 
 H:[FILocationPopUp:0x601f2800(207)],
NSLayoutConstraint:0x60482a30 NSView:0x6012e380.centerX == 
 FILocationPopUp:0x601f2800.centerX,
NSLayoutConstraint:0x604825d0 
 H:[FILocationPopUp:0x601f2800]-(=10)-[SGTSearchField:0x603a5160],
NSLayoutConstraint:0x60482b70 
 H:[SGTSearchField:0x603a5160]-(11)-|   (Names: 
 '|':NSView:0x6012e380 ),
NSLayoutConstraint:0x604814f0 
 H:[SGTSearchField:0x603a5160(=218)]
 )

 Will attempt to recover by breaking constraint
 NSLayoutConstraint:0x604814f0 H:[SGTSearchField:0x603a5160(=218)]

 Set the NSUserDefault 
 NSConstraintBasedLayoutVisualizeMutuallyExclusiveConstraints to YES to have 
 -[NSWindow visualizeConstraints:] automatically called when this happens.  
 And/or, break on objc_exception_throw to catch this in the debugger.
 sessionInfo()

 Session Info:
 R version 3.1.3 (2015-03-09)
 Platform: x86_64-apple-darwin13.4.0 (64-bit)
 Running under: OS X 10.10.1 (Yosemite)

 locale:
 [1] en_US.UTF-8/en_US.UTF-8/en_US.UTF-8/C/en_US.UTF-8/en_US.UTF-8

 attached base packages:
 [1] stats graphics  grDevices utils datasets  methods   base

 other attached packages:
 [1] effects_3.0-3   lattice_0.20-30 lme4_1.1-7  Rcpp_0.11.2 
 Matrix_1.1-5runjags_1.2.1-0 sm_2.2-5.4  foreign_0.8-63  car_2.0-25

 loaded via a namespace (and not attached):
 [1] coda_0.16-1  colorspace_1.2-4 grid_3.1.3   MASS_7.3-39  
 mgcv_1.8-4   minqa_1.2.3  nlme_3.1-120 nloptr_1.0.0 
 nnet_7.3-9
 [10] parallel_3.1.3   pbkrtest_0.4-2   quantreg_5.11SparseM_1.6  
 splines_3.1.3tools_3.1.3

 ~n






 __
 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.

__
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.

Re: [R] not a Stata version 5-12 .dta file

2015-03-19 Thread Ista Zahn
Hi Nicole,

Is it a stata 13 data file? If so your best bet is to open it in Stata
and use the saveold command to save it as a stata 12 file.

Best,
Ista

On Thu, Mar 19, 2015 at 3:00 PM, Nicole Ford nicole.f...@me.com wrote:
 Hello,

 I recently updated to the newest version of R and I am encountering issues.  
 Please find my error and session info below.  My data are attached.  I have 
 tried the readstata13 package just in case to no avail.  Unless I am missing 
 something, google isn’t helping.



 Thank you in advance.



 error:
 dat - read.dta(file.choose())
 Error in read.dta(file.choose()) : not a Stata version 5-12 .dta file
 2015-03-19 14:14:21.445 R[398:5728] Unable to simultaneously satisfy 
 constraints:
 (
 NSAutoresizingMaskLayoutConstraint:0x608000490bd0 h=-- v=-- 
 H:|-(0)-[NSView:0x6012eba0]   (Names: '|':FIFinderView:0x60363a80 ),
 NSAutoresizingMaskLayoutConstraint:0x608000490e50 h=-- v=-- 
 H:[NSView:0x6012eba0]-(0)-|   (Names: '|':FIFinderView:0x60363a80 ),
 NSAutoresizingMaskLayoutConstraint:0x608000491120 h=-- v=-- 
 H:|-(0)-[FIFinderView:0x60363a80]   (Names: 
 '|':NSNavFinderViewFileBrowser:0x608000377400 ),
 NSAutoresizingMaskLayoutConstraint:0x608000491170 h=-- v=-- 
 H:[FIFinderView:0x60363a80]-(0)-|   (Names: 
 '|':NSNavFinderViewFileBrowser:0x608000377400 ),
 NSAutoresizingMaskLayoutConstraint:0x608000491350 h=-- v=-- 
 H:[NSNavFinderViewFileBrowser:0x608000377400(585)],
 NSLayoutConstraint:0x60482d50 H:|-(0)-[NSView:0x6012e380]   
 (Names: '|':NSView:0x6012eba0 ),
 NSLayoutConstraint:0x60482da0 H:[NSView:0x6012e380]-(0)-|   
 (Names: '|':NSView:0x6012eba0 ),
 NSLayoutConstraint:0x604816d0 
 H:[FILocationPopUp:0x601f2800(207)],
 NSLayoutConstraint:0x60482a30 NSView:0x6012e380.centerX == 
 FILocationPopUp:0x601f2800.centerX,
 NSLayoutConstraint:0x604825d0 
 H:[FILocationPopUp:0x601f2800]-(=10)-[SGTSearchField:0x603a5160],
 NSLayoutConstraint:0x60482b70 
 H:[SGTSearchField:0x603a5160]-(11)-|   (Names: '|':NSView:0x6012e380 
 ),
 NSLayoutConstraint:0x604814f0 
 H:[SGTSearchField:0x603a5160(=218)]
 )

 Will attempt to recover by breaking constraint
 NSLayoutConstraint:0x604814f0 H:[SGTSearchField:0x603a5160(=218)]

 Set the NSUserDefault 
 NSConstraintBasedLayoutVisualizeMutuallyExclusiveConstraints to YES to have 
 -[NSWindow visualizeConstraints:] automatically called when this happens.  
 And/or, break on objc_exception_throw to catch this in the debugger.
 sessionInfo()

 Session Info:
 R version 3.1.3 (2015-03-09)
 Platform: x86_64-apple-darwin13.4.0 (64-bit)
 Running under: OS X 10.10.1 (Yosemite)

 locale:
 [1] en_US.UTF-8/en_US.UTF-8/en_US.UTF-8/C/en_US.UTF-8/en_US.UTF-8

 attached base packages:
 [1] stats graphics  grDevices utils datasets  methods   base

 other attached packages:
 [1] effects_3.0-3   lattice_0.20-30 lme4_1.1-7  Rcpp_0.11.2 
 Matrix_1.1-5runjags_1.2.1-0 sm_2.2-5.4  foreign_0.8-63  car_2.0-25

 loaded via a namespace (and not attached):
  [1] coda_0.16-1  colorspace_1.2-4 grid_3.1.3   MASS_7.3-39  
 mgcv_1.8-4   minqa_1.2.3  nlme_3.1-120 nloptr_1.0.0 nnet_7.3-9
 [10] parallel_3.1.3   pbkrtest_0.4-2   quantreg_5.11SparseM_1.6  
 splines_3.1.3tools_3.1.3

 ~n






 __
 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.

__
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.

Re: [R] not a Stata version 5-12 .dta file

2015-03-19 Thread Nicole Ford
 
https://www.icloud.com/attachment/?u=https%3A%2F%2Fms-us-bnx-101-prod.digitalhub.com%2FB%2FAYGiFiulFB2COHtRCU-_sQRlI29CAW_sHDofsKDQThnmmGMRJ-U31uHc%2F%24%7Bf%7D%3Fo%3DAssHSsJnuvs2xSKr9RbahRH8uL2dMLrQZ74X4K5mJvMu%26v%3D1%26x%3D3%26a%3DBcO0mGWsa3VAA0h-KgEA_wHIAP8gEr-c%26e%3D1429394397%26k%3D%24%7Buk%7D%26r%3D7D4FAE4C-D12E-4998-8153-C319E1A27CDF-1%26ckc%3Dcom.apple.largeattachment%26ckz%3D1F23936F-50D9-4B6F-AEB2-6C9A3F72ACB8%26z%3Dhttps%253A%252F%252Fp03-content.icloud.com%253A443%26s%3Ds0BPmPeuYYpZ24XTa4YdvCExEHguk=mdLWla1AWgDRCxhPQhZ8GQf=WV3_Data_rdata_v_2014_09_21.rdatasz=54048483
  mailto:istaz...@gmail.com mailto:nicole.f...@me.com 
 mailto:istaz...@gmail.com mailto:nicole.f...@me.com 
 mailto:R-help@r-project.org https://stat.ethz.ch/mailman/listinfo/r-help
[[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 provide commented, minimal, self-contained, reproducible code.


Re: [R] Timestamp of exported files not updated when the file name is overwritten (ggsave)

2015-03-19 Thread jim holtman
I just tried the example for 'ggsave' and waited a minute between each run,
and the time modified for the file name was correct in that it showed a
different time when run the second time.  Please post the code you  are
running, the system you are using and then an example of what the times
are.  Are you looking at the time 'modified' or 'created'; this will make a
difference.  So a few more particulars about your problem would be
helpful.  Try running the example for ggsave as I did and see if the times
change.


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 Thu, Mar 19, 2015 at 4:48 AM, David Villegas Ríos chir...@gmail.com
wrote:

 Hi.
 I have a script in which I export some plots to a folder in my PC. The
 plots are exported with the function ggsave (in ggplot2).
 Whenever I re-run the code and export updated plots, the name of the
 exported file is overwritten (as expected) but the timestamp is not updated
 what turns it very difficult to locate them, sometimes.

 Any thought or solution for this issue?

 Thanks,

 David

 [[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 provide commented, minimal, self-contained, reproducible code.


[[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 provide commented, minimal, self-contained, reproducible code.