search for: myt

Displaying 20 results from an estimated 36 matches for "myt".

Did you mean: my
2014 Feb 05
1
ldb segment fault. Problem on joining as a DC member.
..._DISCONNECTED] Terminating connection - 'dcesrv: NT_STATUS_CONNECTION_DISCONNECTED' imessaging: cleaning up /var/lib/samba/private/smbd.tmp/msg/msg.2299.98 single_terminate: reason[dcesrv: NT_STATUS_CONNECTION_DISCONNECTED] dreplsrv_notify_schedule(5) scheduled for: Wed Feb 5 22:12:16 2014 MYT dreplsrv_notify_schedule(5) scheduled for: Wed Feb 5 22:12:22 2014 MYT dreplsrv_notify_schedule(5) scheduled for: Wed Feb 5 22:12:27 2014 MYT dreplsrv_notify_schedule(5) scheduled for: Wed Feb 5 22:12:32 2014 MYT dreplsrv_notify_schedule(5) scheduled for: Wed Feb 5 22:12:37 2014 MYT dreplsrv_no...
2006 Nov 23
1
dumping/loading objects with 'tsp' attribute
Dear all, I'm indirectly faced with the fact that setting the 'tsp' attribute of an object modifies its class definition: > class( structure(1:2, tsp=c(1,2,1), class=c("myts","ts")) ) [1] "ts" "myts" In general, this is of really little (ok, I admit: totally no) interest for me because 'myts' class is added just after assigning the 'tsp' attribute (by calling ts). However, this behaviour gives me troubles when re-l...
2004 Jun 22
2
ts & daily timeseries
I have defined a daily timeseries for the 365 days of 2003 issuing: myts = ts(dati[,2:10],frequency=365,) > myts Time Series: Start = c(1, 1) End = c(1, 365) Frequency = 365 and mytime = as.POSIXct(strptime(as.character(dati[,1]),format="%Y-%m-%d")) contains the dates from "2003-01-01" to "2003-12-31" How can I combine mytime...
2010 Jul 30
4
transpose of complex matrices in R
...hat that wasn't a mistake. Matlab and Octave sort of recognize this, as "A'" means the Hermitian transpose of "A". In R, this issue makes t(), crossprod(), and tcrossprod() pretty much useless to me. OK, so what to do? I have several options: 1. define functions myt(), and mycrossprod() to get round the problem: myt <- function(x){t(Conj(x))} 2. Try to redefine t.default(): t.default <- function(x){if(is.complex(x)){return(base::t(Conj(x)))} else {return(base::t(x))}} (This fails because of infinite recursion, but I don't quite understand why)...
2005 Nov 15
2
Subtracting timeseries objects
Sorry to keep posting but I want to do this right and I'm hoping for some pointers I now have two time series objects which I need to subtract. Unfortunatly the two series dont have the same sample rates. When I try to subtract them avgSub<-avg1-avg2 The time series object is clever enough to object. So I guess I need to write a function for subtraction of the time series objects which
2013 May 01
2
significantly different from one (not zero) using lm
Hello, I am work with a linear regression model: y=ax+b with the function of lm. y= observed migration distance of butterflies x= predicted migration distance of butterflies Usually the result will show if the linear term a is significantly different from zero based on the p-value. Now I would like to test if the linear term is significantly different from one. (because I want to know
2005 Apr 27
3
Time series indexes
I tried to assign values to specific elements of a time series and got in trouble. The code below should be almost self-explanatory. I wanted to assign 0 to the first element of x, but instead I assigned zero to the second element of x, which is not what I wanted. Is there a function that will allow me to do this without going into index arithmetic (which would be prone to errors)? FS >
2009 May 08
0
why doesn't t.test value include standard error
...se=mu-hat/t, but I was surprised. Do you think it would be nicer if t.test did include the denominator in the output? If we had that output, we could more easily compare the different methods of calculating the standard error that are discussed in ?t.test. ex: > x <- rnorm(100, m=10) > myt <- t.test(x, m=8) > attributes(myt) $names [1] "statistic" "parameter" "p.value" "conf.int" "estimate" [6] "null.value" "alternative" "method" "data.name" $class [1] "htest"...
2009 May 26
2
Problem with fractional seconds
...le with fractional seconds to class POSIXct. I have set my options to include digits.secs and my format to just time, but my output is the current date with my time lacking the fractions of a second. For example: options(digits.secs=3) t<-c("06:00:00.100","06:00:01.231") myt<-as.POSIXct(t,format="%H:%M:%S") myt [1] "2009-05-26 06:00:00 HST" "2009-05-26 06:00:01 HST" I would like the output to be just time with fractional seconds. I.e. 06:00:00.100,06:00:01.231 I have also tried Chron times() which did not work either. Interestingly...
2007 Jul 07
1
calculating p-values of columns in a dataframe
...I calculate the t-statistic for each column. What is a "good" method to calculate/look-up the p-value for each column? mydf=data.frame(a=c(1,-22,3,-4),b=c(5,-6,-7,9)) mymean=mean(mydf) mysd=sd(mydf) mynn=sapply(mydf, function(x) {sum ( as.numeric(x) >= -Inf) }) myse=mysd/sqrt(mynn) myt=mymean/myse myt --------------------------------- Food fight? Enjoy some healthy debate [[alternative HTML version deleted]]
2009 Dec 03
0
smoothing or curve-fit a time series using lowess, polynomial or whatever I can get working
...12.0 2392353.1 3368193.8 2496529.3 3089231.2 4334911.7 3577551.2 4450100.7 4581147.2 4501380.8 4406765.3 4326864.4 4253378.1 4142437.6 3931249.9 3658728.2 3364516.9 3103204.5 2878541.5 2684296.9 2513390.0 2360164.3 2211494.8 2074479.4 1947117.0 1828018.3 1716195.3 1610921.2 dec=".",) > myTS<- ts(df, start=c(2008,1), frequency=12) > > myTS Jan Feb Mar Apr May Jun Jul Aug Sep Oct Nov Dec 2008 0.0 0.0 0.0 29925.0 60663.0 221873.5 480491.0 231454.5 193697.5 289078.1 446774.9...
2011 Oct 27
1
plotting large time series
...s get too large to be handled (> 10MB, one was even 200MB big). So I wonder, if there would be a possibilty to either - reduce the file size of the PDF - change the way the plot is generated to reduce the plot size? I use: plot(myDate,myFile[,1],type="l",xlab="Date") using myts = as.ts(start=myDate[1],end=myDate[length(myDate)],x=myFile[,1]) plot.ts(myts,xlab="Date") produces the same file size. for storing the PDF I use: pdf(file=paste(outpath,"myPDF.pdf",sep=''),paper="a4r"). I would be very grateful for an answer!!!!
2012 May 10
1
stop calculation in a function
...ngth(x)){ if((!is.na(x[i]))){ if((tps[i]-tps[ind_temp] < ecart_temps) & (abs(x[i]-temp) > seuil)){ #&(abs(x[i+1]-x[i])<1)){ st1[i] <- NA } else { temp <- st1[i] <- x[i] ind_temp <- i } } } return(st1) } dat1 <- myts[,2] myts[,2] <- apply(dat1,2,function(x) out2NA(x,2)) -- View this message in context: http://r.789695.n4.nabble.com/stop-calculation-in-a-function-tp4622964.html Sent from the R help mailing list archive at Nabble.com.
2002 Nov 25
3
Full enumeration, how can this be vectorized
...x[i] best.y <- y[j] best.z <- z[k] } } return (c( best.x, best.y, best.z)) } fun <- function(x, par, currentBestValue=Inf) { x = x[1] y = x[2] z = x[3] TMax <- length(par) result <- 0 for (myT in 1:TMax) { result <- result + ( ((x * z) / (y-1) * (1 - (z / (z + myT))^(y-1) )) - par[myT] )^2 # Allow for short-cut evaluation if running in complete enumeration mode if (is.na(result) || currentBestValue < result) { return (Inf) } } re...
2007 Jun 01
1
Time format
Dear R-help list members, I am new to R, and having problems with plotting part of a time series. I have read in my data using read.table, and my 'time' column is recognised as a numeric variable. When I convert this to a time format, I am no longer able to use its values on my x-axis. The problem is that I only want part of the time series to appear on the plot, ignoring the first 23
2005 Nov 09
8
Element-by-element multiplication operator?
Is there an element-by-element multiplication in R, like the .* operator in Matlab? eg: A (2x3) B (2x3) C=A.*B C (2x3) C = [[a11*b11 a12*b12 a13*b13]; [a21*b21 a22*b22 a23*b23]] I can't find one... Thanks -Mike Gates
2004 Jun 10
1
RE: question about prepaid app_prepaid
...char announcemsg[256] = "", *ann; struct localuser *outgoing=NULL, *tmp; struct ast_channel *peer; *************** *** 380,385 **** --- 382,390 ---- struct varshead *headp, *newheadp; struct ast_var_t *newvar; int go_on=0; + time_t myt; + int iBrdgTO=0; /* CHANGE: Time out after call bridged. Storm Petersen */ + if (!data) { ast_log(LOG_WARNING, "Dial requires an argument (technology1/number1&technology2/number2...|optional timeout)\n"); *************** *** 41...
2002 Feb 20
1
Regarding acf
help . I have a file which contains a table that has 2 columns of which the first one is a time sereis. I need to extract the first column alone and do an acf plot on it. I dont know how to extract the first column and pass it to the acf function in the ts package. Can anybody pls help me. end -.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.-.- r-help mailing list
2006 Mar 17
1
How to change the label in plot.ts ?
Hi you guys: I have been wondering if there is any way to change the labeling in plot.ts( ), for example , if I plot two sequences, i always got y labels as "series1", "series2", I tried to use ylab=c((expression(mu_1)),(expression(mu_2))), but it doesn't work. thanks in advance for any help best.
2004 Jun 10
3
FW: question about prepaid app_prepaid
Hi, I have compiled and installed app_prepaid module. But have problem when connect to postgres database. I guess so because after key in card number, it always play prepaid-no-aaa voice file. Anyone succeeded in configuring the app_prepaid for prepaid calling service for asterisk? Please help. Ps: where can I view the log file for this module. Thanks. Tom --------------