Displaying 20 results from an estimated 58 matches for "vjust".
Did you mean:
just
2016 Apr 17
0
use hjust or vjust with dendextend
...t("nodes_pch", 19) %>%
set("nodes_col", c("orange", "black", "plum", NA))
ggd2 <- as.ggdend(dend2)
ggplot(ggd2, horiz = TRUE, theme = NULL)
My problem is that the labels overlap the dendogram leafs and I have no
idea on how parameter hjust or vjust may be used to create space between
label and leaf.
Thanks for any help,
Sergio
[[alternative HTML version deleted]]
2024 Jun 26
2
Ayuda para hacer una lista
..._continuous(limits=c(0,100), breaks=seq(0,100, by=10))+
theme_bw()+
theme(panel.grid.major = element_line(colour = "gray85"),
panel.grid.minor = element_line(colour = "gray85"),
axis.text.x = element_text(color = "black", size = 12,angle=45,
hjust=1,vjust=1),
axis.text.y= element_text(color = "black", size = 12,angle=0,
hjust=0.5,vjust=0.5),
axis.title.x=element_text(color = "black", size = 15,angle=0,
hjust=0.5,vjust=0.5),
axis.title.y=element_text(color = "black", size = 15,angle=90,
hjust=0.5,...
2016 Apr 09
1
Run script R
...= 1, lineend = "butt"),? ? ? rect = ? ? ? ? ? ? ? element_rect(fill = "white", colour = "black", size = 0.5, linetype = 1),? ? ? text = ? ? ? ? ? ? ? element_text(family = base_family, face = "plain", colour = "black", size = base_size, hjust = 0.5, vjust = 0.5, angle = 0, lineheight = 0.9),? ? ? axis.text = ? ? ? ? ?element_text(size = rel(0.8), colour = "grey50"),? ? ? strip.text = ? ? ? ? element_text(size = rel(0.8)),
? ? ? axis.line = ? ? ? ? ?element_blank(),? ? ? axis.text.x = ? ? ? ?element_text(family = base_family, size = base_si...
2010 Nov 20
2
Merge two ggplots
...(ggplot2)
agent<-CRagent[[agentid]] # To make following expression shorter
ggplot((data.frame(x=CRX,y=CRY,sr=agent$sr)))+
geom_point(aes(x,y,colour=cut(sr,c(0,-10,-20,-30,-40,-50,-60,-70,-80))))+
geom_text(aes(x,y,color=cut(sr, c(0,-10,-20,-30,-40,-50,-60,-70,-80)), label=round(sr,3)),vjust=1,legend=FALSE)+labs(colour="CRagents[[i]]$sr")
}
plot_shad_f<-function(f){
library(ggplot2)
plotdata<-melt(f)
names(plotdata)<-c('x','y','z')
v<-ggplot(plotdata, aes(x, y, z = z))
v + geom_tile(aes(fill=z))
}
The first plot puts points...
2024 Jun 26
1
Ayuda para hacer una lista
...0,100), breaks=seq(0,100, by=10))+
> theme_bw()+
> theme(panel.grid.major = element_line(colour = "gray85"),
> panel.grid.minor = element_line(colour = "gray85"),
> axis.text.x = element_text(color = "black", size = 12,angle=45,
> hjust=1,vjust=1),
> axis.text.y= element_text(color = "black", size = 12,angle=0,
> hjust=0.5,vjust=0.5),
> axis.title.x=element_text(color = "black", size = 15,angle=0,
> hjust=0.5,vjust=0.5),
> axis.title.y=element_text(color = "black", size = 1...
2024 Jun 27
2
Ayuda para hacer una lista
...by=10))+
> > theme_bw()+
> > theme(panel.grid.major = element_line(colour = "gray85"),
> > panel.grid.minor = element_line(colour = "gray85"),
> > axis.text.x = element_text(color = "black", size = 12,angle=45,
> > hjust=1,vjust=1),
> > axis.text.y= element_text(color = "black", size = 12,angle=0,
> > hjust=0.5,vjust=0.5),
> > axis.title.x=element_text(color = "black", size = 15,angle=0,
> > hjust=0.5,vjust=0.5),
> > axis.title.y=element_text(color = &q...
2011 Jun 21
2
qplot/ggplot2 Questions
...t;,"RapidMiner R extension","Eclipse with
StatET","Rstudio","Built-in R console"))
q<-q+opts(axis.text.x = theme_text(colour = "black", size = 12))
q<-q+opts(plot.title = theme_text(colour = "black", face="bold", size = 16,
vjust=2))
q<-q+opts(axis.text.y = theme_text(colour = "black", hjust=1))
q<-q+opts(axis.title.y = theme_text(face= "bold", size= 12, angle=90))
q<-q+opts(axis.title.x = theme_text(face= "bold", size= 12, vjust=-.5))
q
--
View this message in context: http://r.78969...
2009 May 08
1
centering axis labels in lattice
...ight-justified
xyplot(
y ~ x,
to.plot,
pch = 19,
ylab = "",
xlab = "",
cex = 3
);
# now try to set the positioning via scales
xyplot(
y ~ x,
to.plot,
pch = 19,
ylab = "",
xlab = "",
cex = 3,
scales = list(
labels = to.plot$y,
hjust = 0.5,
vjust = 0.5
)
);
I also explored using yscale.components.default(), but specifying
hjust and vjust there did not help. Any suggestions would be very
much appreciated!
Paul
> sessionInfo();
R version 2.8.1 (2008-12-22)
i386-pc-mingw32
locale:
LC_COLLATE=English_United States.1252;LC_CTYPE=E...
2013 Sep 26
1
Less than equal to symbol in ggplot2 legend text
...t_blank(),
axis.text.y = element_text(size=16,colour="black"),plot.title =
element_text( face="bold",size=18),
legend.justification=c(0,1), legend.position=c(0,1),
axis.title.x = element_text(face="bold", colour="black",
size=16,vjust=0),
axis.title.y = element_text(face="bold", colour="black",
size=16,vjust=0.3),
legend.text = element_text(size = 12, face = "bold" )) +
ggtitle(GGTitle)+
geom_line() + geom_point(size=5) +
geom_errorbar(width=0.1, aes(ymin=meanYvar-seYvar,...
2013 Apr 18
1
Arranging two different types of ggplot2 plots with axes lined up
...03,2003,
2004,2004,2004,2004,2004,2004,2004,2004,2004,2004)
fc<-sample(1:1000, 50)
yfc<-data.frame(year2, fc)
#make test precipitation plot
yp_plot<-ggplot(yp) + geom_point() + geom_line() + aes(year, y=precip) +
opts(title="Site X \n ", axis.text.x=theme_text(angle=45, hjust=1,
vjust=1)) +
ylab("Annual Precipitation (in.) \n ") + xlab("")
#make test fecal coliform plot
yfc_plot<-ggplot(yfc) + geom_boxplot() + aes(x=as.factor(year2), y=fc) +
opts(axis.text.x=theme_text(angle=45, hjust=1, vjust=1)) +
xlab(" \n Date") + ylab("Fecal coliforms...
2024 Jun 28
1
Ayuda para hacer una lista
...gt; theme_bw()+
>>> theme(panel.grid.major = element_line(colour = "gray85"),
>>> panel.grid.minor = element_line(colour = "gray85"),
>>> axis.text.x = element_text(color = "black", size = 12,angle=45,
>>> hjust=1,vjust=1),
>>> axis.text.y= element_text(color = "black", size = 12,angle=0,
>>> hjust=0.5,vjust=0.5),
>>> axis.title.x=element_text(color = "black", size = 15,angle=0,
>>> hjust=0.5,vjust=0.5),
>>> axis.title.y=eleme...
2010 Sep 01
2
ggplot2 multiple group barchart
...m","f","f")
d.data <- data.frame (v1, v2, v3, gender)
d.data
x <- names (d.data[1:3])
y <- mean (d.data[1:3])
pl <- ggplot (data=d.data, aes (x=x,y=y))
pl <- pl + geom_bar()
pl <- pl + coord_flip()
pl <- pl + geom_text (aes(label=round(y,1)),vjust=0.5,
hjust=4,colour="white", size=7)
pl
this gives me a nice barchart to compare the means of my variables
"v1","v2" and "v3".
my question: how do i have to proceed if i want this barchart splittet
by the variable "gender".
so i get two small bars...
2006 Nov 13
1
bug in lrect [lattice]?
...)
my.lrect <- function (xleft, ybottom, xright, ytop, x = (xleft + xright)/2,
y = (ybottom + ytop)/2, width = xright - xleft, height = ytop -
ybottom, col = "transparent", border = "black", lty = 1,
lwd = 1, alpha = 1, just = "center", hjust = NULL, vjust = NULL,
...)
{
if (missing(border)) ## this line fixes it
border <- if (all(is.na(border)))
"transparent"
else if (is.logical(border)) {
if (border)
"black"
else "transparent"
}
grid:::grid.rect(x = x, y = y, width = wi...
2009 Oct 17
2
Putting names on a ggplot
...om_vline(xintercept=month.counts) +
ylab("Temperature (C)") + xlab("Daily Temperatures")
p
# this is where I see the problem.
p <- p + geom_text(aes(x = namposts + 2.5, y = temprange[2], label = mlabs),
data = year, size = 2.5, colour='black', hjust = 0, vjust = 0)
p
=============================================================================
DATA
=============================================================================
year <- structure(list(month = c(1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L,
1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1L, 1...
2009 Apr 07
2
xyplot - label one line
...les=list(x=list(alternating=3),y=list(alternating=3)),
panel = function(x, y, groups, subscripts, ...) {
panel.grid(h = -1,v = 0)
##grid.text( unit( x, "native") , unit( y, "native") ,
## label =y, gp = gpar( cex = 0.9, fontface="bold"),
hjust=c(1,1), vjust=c(-1,-1))
panel.superpose.2(x = x, y = y, groups = groups,
subscripts = subscripts,...)},
type = c("p", "o"))
[[alternative HTML version deleted]]
2017 Jun 24
2
Orden de categorías en gráficos de barras (position = "stack")
...os Espacios (N = 311)."
caption <- 'FLACSO - UNICEF - SENAF (2017)'
ggplot(tabla.barras, aes(x = Rangos, y = Asistentes, fill = Clase)) + #
geom_bar(stat = "identity", position = "stack") +
geom_text(aes(label = Asistentes), position = position_stack(), vjust
= 1, size = 4) +
labs(title = "Asistentes por tipo de servicio según tramo de edad."
, subtitle = subtit.todos
, x = "", y = "Cantidad de asistentes"
, caption = caption) +
theme(legend.position = "bottom", legend.direc...
2017 Jun 25
3
Orden de categorías en gráficos de barras (position = "stack")
...<- "Todos los Espacios (N = 311)."
caption <- 'FLACSO - UNICEF - SENAF (2017)'
ggplot(tabla.barras, aes(x = Rangos, y = Asistentes, group = Clase2, fill
= Clase2)) +
geom_col(position = "stack") +
geom_text(aes(label = Asistentes), position = position_stack(), vjust =
1, size = 4) +
labs(title = "Asistentes por tipo de servicio según tramo de edad."
, subtitle = subtit.todos
, x = "", y = "Cantidad de asistentes" ) +
# , caption = caption) +
theme(legend.position = "bottom", legend.direction = &q...
2012 Feb 06
1
ggplot2 geom_polygon fill
...ch borders, only the
as of yet unattainable fill.
Here's my code:
library(ggplot2)
library(plyr)
# define good looks
no_margins <- opts(
axis.line = theme_blank(),
axis.text.x = theme_blank(),
axis.ticks = theme_blank(),
axis.title.x = theme_text(size = 12, vjust = 0.15),
axis.title.y = theme_text(angle = 90, size = 12, vjust = 0.2),
axis.ticks.length = unit(0, "cm"),
axis.ticks.margin = unit(0, "cm"),
panel.background = theme_blank(),
panel.grid.major = theme_blank(),
panel.grid.minor = theme_blank(),
plot.background =...
2011 Jul 08
1
Referencing a vector of data labels in ggplot function
...= factor, color = factor))
p2 <- p + geom_line(size = 1)
# + opts(title = plotName)
p2 <- p2 + facet_grid(Facet~., scales = 'free') +
# p2 <- p2 + geom_text(data = dframe[dframe[,'date'] == '1941-06-16',],
# aes(date, value, label = lineNames, vjust = 1)) +
scale_colour_manual(values = colors)
}
finalP <- withNames(data, plines, pTitle, col1)
#finalP <- simple(data)
[[alternative HTML version deleted]]
2015 Sep 04
2
Añadir escala a un mapa
...gend="left", base_layer=ggplot(datos, aes(x=lon, y=lat))) +
geom_point(data=datos, aes(shape = INSTRUMENTACIÓN, color=INSTRUMENTACIÓN, fill=INSTRUMENTACIÓN), size=7.5) +
geom_text(data=coord.geog[1:7,], aes(x=coord.geog$lon[1:7], y=coord.geog$lat[1:7], label=nombres.pluvio, hjust=0.2, vjust=1), size=5.2) +
scale_shape_manual(values=c(21,24,22,23)) +
geom_polygon(aes(x=long, y=lat, group=group), data=area.fort, colour="black", fill="brown", alpha=0.15, size=0.5, linetype=5)
dev.off()
Mi duda es:
¿Cómo puedo añadir una escala en km a esa imagen (mapa)?
Grac...