Displaying 20 results from an estimated 137 matches for "roi".
Did you mean:
rdi
2007 Apr 25
1
barchart producing incorrect number of barcharts when columns renamed
...esultsDirs=c("../data/Group.results.clipped");
for (resultsDir in resultsDirs) {
cat(resultsDir, "\n")
if (any(grep("clipped", resultsDir)))
{
clipping="(Clipped)";
}
else
{
clipping="(NOT Clipped)";
}
roi.errs=read.table(paste(resultsDir,
"allGroupsROI.acrossGroupWithinEvent.errs", sep="/"), header=T, sep="");
roi.errs.names=names(roi.errs);
# ctrl
roi.errs.ctrl<-roi.errs[roi.errs[,"Group"]=="ctrl",...
2007 Mar 25
1
for loop help
...ss.count = ss.count + 1
query.string <- paste("SELECT * FROM ",ss,";",sep="")
#print(query.string)
data_gcs <- dbGetQuery(con, query.string)
attach(data_gcs)
names(data_gcs)
mat_row = 0
for(i in levels(roi.list)){
print (i)
current.roi <- data_gcs[data_gcs$ROI==i,]
current.roi.plus.z <- data.frame(current.roi,
scale(current.roi[,15]), scale(current.roi[,18]),
scale(current.roi[,21]), scale(current.roi[,24]))
testextrem <- function(x) {if ((ab...
2005 Feb 18
1
Two-factorial Huynh-Feldt-Test
...to do the same calculation (and get the same results) as SAS in order to
make the transition easier for users of the script.
In the script, I'm dealing with a two-factorial repeated-measures anova.
I'll try to give you a short overview of the setup:
- two between-cell factors: facBetweenROI (numbering regions of
interest, 6 levels) and facBetweenCond (numbering conditions, 2 levels).
- one within-cell factor: facWithin (which numbers subjects, while
subjects are considered repetitions of the same measurement). This is
basically the repeatedness of the data.
For this data, I do ano...
2006 May 11
1
model formulation for the following ANOVA
...a
group: 1 2 1 2 1 2 1 2 ... as factor, 2 levels between subjects fixed effect (patient vs control)
subj: 1 2 ... 14 1 2 ... 14 as factor 7 patients 7 control random effect
condition: 1 1 ... 2 2 ... 1 1 ... 2 2 as factor, 2 levels within subjects, ie every subject worked on every cond fixed effect
roi: 1 ... 2 ... 3 ... 4 ... as factor, 4 levels within subjects, ie signal was recored for every subject from all brain regions (of course) fixed effect
mean: as numeric the signal mean value in a given time window
I arranged that data in a data.frame called roiData
I want a linear model of groupmemb...
2009 Dec 08
6
conditionally merging adjacent rows in a data frame
Hi, I have a data frame and want to merge adjacent rows if some condition is
met. There's an obvious solution using a loop but it is prohibitively slow
because my data frame is large. Is there an efficient canonical solution for
that?
> head(d)
rt dur tid mood roi x
55 5523 200 4 subj 9 5
56 5523 52 4 subj 7 31
57 5523 209 4 subj 4 9
58 5523 188 4 subj 4 7
70 4016 264 5 indic 9 51
71 4016 195 5 indic 4 14
The desired result would have consecutive rows with the same roi value merged.
dur values should be added and x values av...
2006 Mar 28
1
variables as arguments in formulae in aov?
...ownames, variables, varnames,
extras, extranames, :
invalid variable type
The line causing the problem is the first line inside the for loop.
The question is what have I done wrong? Is there a better way of doing
the ANOVAs?
Thanks in advance,
Bye,
Colm.
-------------- next part --------------
roi.errs=read.table("../Group.results/allGroupsROI.errs", header=T, sep="\t");
roi.stops=read.table("../Group.results/allGroupsROI.stops", header=T, sep="\t");
# extract the names of the columns containing the means
roi.names=names(roi.errs);
meanColumns=roi.nam...
2005 Mar 10
1
contrast matrix for aov
...cts in each cell (a balanced design) and we want to
specify the interaction contrast so that:
CueLeft>CueRght for the Right Hemisphere
CueRght>CueLeft for the Left Hemisphere.
Here is a copy of the relevant commands for R:
########################################
lh_cueL <- rowMeans( LHroi.cueL[,t1:t2] )
lh_cueR <- rowMeans( LHroi.cueR[,t1:t2] )
rh_cueL <- rowMeans( RHroi.cueL[,t1:t2] )
rh_cueR <- rowMeans( RHroi.cueR[,t1:t2] )
roiValues <- c( lh_cueL, lh_cueR, rh_cueL, rh_cueR )
cuelabels <- c("CueLeft", "CueRight")
hemlabels <- c("LH"...
2005 Feb 22
3
Reproducing SAS GLM in R
Hi,
I'm still trying to figure out that GLM procedure in SAS.
Let's start with the simple example:
PROC GLM;
MODEL col1 col3 col5 col7 col9 col11 col13 col15 col17 col19 col21 col23
=/nouni;
repeated roi 6, ord 2/nom mean;
TITLE 'ABDERUS lat ACC 300-500';
That's the same setup that I had in my last email. I have three factors:
facSubj,facCond and facRoi. I had this pretty much figured out with
three lengthy calls to lm(), but I have to extend my code to also work
on models with four...
2009 Feb 11
1
Variables captured in closures get copied?
Hi list! I have a data frame called fix and a list of index vectors
called rois:
> head(rois, 3)
[[1]]
[1] 2 1
[[2]]
[1] 3
[[3]]
[1] 6 7 28 26 27 24 25
The part that's causing the issue is the following line:
lapply(rois, function(roi) fix$x[roi] <- 100)
So for every index vector I'd like to set the respective entries in the
data frame (f...
2009 Jan 10
0
RMySQL CREATE TABLE error
...t"
"snr_adultsTS1" "snr_adultsTS2"
"time_series_small" "tvalFDR_small"
6 > temp1 <- paste("CREATE TEMPORARY TABLE MyTemporaryTable1 SELECT *
FROM time_series_small WHERE participant = '005_avg' AND roi = '1033'
AND timeseries_run = '1';")
7 > temp2 <- paste("CREATE TEMPORARY TABLE MyTemporaryTable2 SELECT *
FROM time_series_small WHERE participant = '005_avg' AND roi = '1033'
AND timeseries_run = '2';")
8 > temp3 <- paste("...
2012 Jul 17
1
Need Help in a Combinatorial Optimzation Problem
Dear Community,
I have a problem I am trying to code in R.
Suppose there are 7 products and each have a ROI value attached to it.
There are 400 representatives who calls 150,000 customers with these
product detailing and achieve sales through the calls.
There is a cost per call and revenue earned from the call.
Constraint is revenue should be greater than the cost.
Now there can be at most 7 choose 3 = 3...
2005 Jan 03
2
problem with default_mail_env
I'v set the default_mail_env to maildir:/var/maildir/%d/%u where
/var/maildir/ is the root dorectory for my maildir tree and I'm
getting the folowing error in the maillog :
Jan 3 15:16:58 websrv pop3(roi): unlink(/var/maildir//roi/cur/new:2,T) failed:
Is a directory
Notice that the %d is missing.
If I change to 'default_mail_env =
maildir:/var/maildir/example.tld/%u' then it's all working fine only I
can't create other virtual domains.
If anybody can help me solve this one...
2007 Oct 22
0
anova and contratst
...into the format required by R and would be grateful if someone could
confirm for me whether I've got the contrasts right in the sample
code below.
I'm working on the assumption that the contrasts are index according
to the way that levels reports them for a factor.
In my case levels(roi.errs$Group) reports ctrl, long, short in that
order so I'm assuming that to compare ctrl to short the correct
contrast is c(1, 0, -1). Am I correct?
I tried to perform 3 contrasts with my data and make.contrasts
complained about there being too many contrasts specified. Is this
because...
2009 Nov 25
2
order of panels in xyplots
I'd like do a simple xyplot with customized order of panels and try to
understand how to use index.cond for that. Several attempts didn't
deliver the correct results. Now, I noticed the following:
> p <- xyplot(dur~roi|trial, data)
> p$index.cond
[[1]]
[1] 1 2 3 4 5 6 7 8 9 10
These numbers are "valid indexing vector for the integer vector
'1:nlevels(g_i)'" but
levels(data$trial)[p$index.cond[[1]]]
does not yield the correct level names of the data points in data.
(Actually the...
2008 Sep 02
2
Help with nonlinear regressional
Dear All,
I am doing experiments in live plant tissue using a laser confocal
microscope. The method is called "fluorescence recovery after
photo-bleaching" (FRAP) and here follows a short summary:
1. Record/ measure fluorescence intensity in a defined, round region of
interest (ROI, in this case a small spot) to determine the initial intensity
value before the bleaching. This pre-bleach value is also used for
normalising the curve (pre-bleach is then set to 1).
2. Bleach this ROI (with high laser intensity).
3. Record/ measure the recovery of fluorescence over time in the R...
2006 Apr 12
0
how to interpret the results of a simint call
...the call to
simint. Could someone help me with this?
I've attached the code and the results it produced. There are 3 groups
(ctrl,long,short) and I'm trying to see if the data in the Mean_12
column (in the example below) differs based on group membership.
for (meanCol in meanColumns) {
roi.err.aov<-aov(eval(parse(text=meanCol)) ~ Group, data=roi.errs);
HSD.err<-simint(eval(parse(text=meanCol)) ~ Group, data=roi.errs,
type="Tukey");
cat("################################################################################\n");
cat("### Summary of AOV for...
2005 Feb 23
1
H-F corr.: covariance matrix for interaction effect
...;- (k^2 * (mean(S) - mean(diag(S)))^2)
N1 <- sum(S^2)
N2 <- 2 * k * sum(apply(S, 1, mean)^2)
N3 <- k^2 * mean(S)^2
epsiGG <- D / ((k - 1) * (N1 - N2 + N3))
epsiHF <- (n * (k-1) * epsiGG - 2) / ((k-1) * ((n-1) - (k-1)*epsiGG))
c(epsiGG,epsiHF)
}
# three factors, facROI,facCond,facSubj
# facROI,facCond are main effects, facSubj is "repeatedness"
# G-G and H-F corrections for a main effect
# we do the gghf stuff for the ROI, which means ROIs in columns,
# subjects in rows
mtx <- NULL
for (iROI in 1:length(unique( facROI ))) {
for (iSubj in 1:length(...
2005 Feb 23
1
H-F corr.: covariance matrix for interaction effect
...;- (k^2 * (mean(S) - mean(diag(S)))^2)
N1 <- sum(S^2)
N2 <- 2 * k * sum(apply(S, 1, mean)^2)
N3 <- k^2 * mean(S)^2
epsiGG <- D / ((k - 1) * (N1 - N2 + N3))
epsiHF <- (n * (k-1) * epsiGG - 2) / ((k-1) * ((n-1) - (k-1)*epsiGG))
c(epsiGG,epsiHF)
}
# three factors, facROI,facCond,facSubj
# facROI,facCond are main effects, facSubj is "repeatedness"
# G-G and H-F corrections for a main effect
# we do the gghf stuff for the ROI, which means ROIs in columns,
# subjects in rows
mtx <- NULL
for (iROI in 1:length(unique( facROI ))) {
for (iSubj in 1:length(...
2011 Feb 11
2
sangoma wanpipe install error
Trying to install wanpipe 3.5.18.
No errors during compile. But when I reach the point where wanpipe and
dahdi_cfg is started, I encountered an error.
Starting WAN Router...
Loading WAN drivers: wanpipe done.
Starting up device: wanpipe1
wanconfig: WAN device wanpipe1 driver load failed !!
: ioctl(wanpipe1,ROUTER_SETUP) failed:
: 22 - Invalid
2005 Jun 22
3
How to I change server=[Samba 3.04.14a-2] to something else?
...ps bugging me:
When I run locallly: smbclient -L localhost -U%
I get the following:
-----------------------------
Domain=[MYDOMAIN] OS=[Unix] Server=[Samba 3.0.14a-2]
Sharename Type Comment
--------- ---- -------
IPC$ IPC IPC Service (ROI Fileserver)
netlogon Disk Network Logon Service
profiles Disk Profile Share
office Disk Primary data share
management Disk Data share for management only
awc Disk AWC drivers storage
app...