Skip to content

Instantly share code, notes, and snippets.

View fawda123's full-sized avatar

Marcus W Beck fawda123

View GitHub Profile
SiteName Year Restoration Reference ObserverNames Precipitation Temperature
IGH 2005 3 3 Tyler_Amanda 0 48
Kelly 2005 4 2 Patrick_Chelsea 0 48
Carlton 2005 2 3 David_Megan 0 48
IGH 2006 9 6 Tyler_Amanda 0 52
Kelly 2006 9 1 David_Megan 0 52
Carlton 2006 7 3 Patrick_Chelsea 0 52
IGH 2007 12 7 David_Megan 12 41
Kelly 2007 2 18 Jeremy_Lucy 12 41
Carlton 2007 11 2 Patrick_Chelsea 12 41
@fawda123
fawda123 / column_int.r
Last active December 17, 2015 06:49
column_int
column.int<-function(int.fun='dnorm(x)',num.poly=20,from.x=-1.96,to.x=1.96,plot.cum=F){
if (!require(ggplot2) | !require(scales) | !require(gridExtra)) {
stop("This app requires the ggplot2, scales, and gridExtra packages. To install, run 'install.packages(\"name\")'.\n")
}
if(from.x>to.x) stop('Starting x must be less than ending x')
if(is.character(int.fun)) int.fun<-eval(parse(text=paste('function(x)',int.fun)))
@fawda123
fawda123 / server.R
Last active December 17, 2015 06:19
shiny_integrate
if (!require(ggplot2) | !require(scales) | !require(gridExtra) | !require(shiny)) {
stop("This app requires the shiny, ggplot2, scales, and gridExtra packages. To install, run 'install.packages(\"name\")'.\n")
}
# Define server logic required to generate and plot a random distribution
shinyServer(function(input, output) {
output$intPlot <- renderPlot({
require(ggplot2)
require(scales)
@fawda123
fawda123 / mc_int_ex.r
Created April 29, 2013 20:15
mc_int_ex
mc.int.ex<-function(x.range=c(-3,3),int=c(-1.96,1.96),n=10000,plot=T,
plot.pts=T,plot.poly=T,cols=list('black','green','blue'),round.val=2,val=F){
require(scales)
#create data for model fit
x.fit<-seq(x.range[1],x.range[2],length=n)
y.fit<-dnorm(x.fit)
dat.fit<-data.frame(x.fit,y.fit)
@fawda123
fawda123 / mc_int.r
Created April 29, 2013 18:54
mc_int
mc.int<-function(mod.in,int=NULL,n=10000,int.base=0,plot=T,plot.pts=T,
plot.poly=T,cols=list('black','green','blue'),round.val=2,val=F){
require(scales)
#variable names from model
if(is.null(mod.in$call$formula)){
x.names<-colnames(eval(mod.in$call$x))
y.names<-colnames(eval(mod.in$call$y))
x.range<-range(eval(mod.in$call$x))
@fawda123
fawda123 / plot_qual.r
Last active October 24, 2016 14:04
plot_qual
plot.qual<-function(x,x.locs=c(0.01,0.99),y.locs=c(0,1),steps=NULL,sp.names=NULL,dt.tx=T,rsc=T,
ln.st=NULL,rs.ln=c(3,15),ln.cl='RdYlGn',alpha=0.7,leg=T,rnks=FALSE,...){
require(RColorBrewer)
require(scales)
if(length(x.locs) != 2 | length(y.locs) != 2)
stop('x and y dimensions must be two-element vectors')
if(x.locs[1]<0 | x.locs[2]>1 | y.locs[1]<0 | y.locs[2]>1)
@fawda123
fawda123 / loess_fitting.r
Last active December 14, 2015 23:29
loess_fitting
obs<-100
x<-runif(obs,0,100)
y<-x^2+rnorm(obs,0,800)
require(scales)
#examples with span
par(mfrow=c(2,2),mar=c(4,4,0.5,0.5),family='serif')
span<-round(seq(0.5,0.1,length=4),2)
for(i in span){
@fawda123
fawda123 / server.R
Last active December 14, 2015 22:20
shinyServer(function(input, output) {
myData <- reactive({
read.csv(input$file$datapath)
})
output$summary <- renderPrint({
if (is.null(input$file)) {
return(cat('File not uploaded'))
@fawda123
fawda123 / nnet_plot_fun.r
Last active December 14, 2015 12:29
nnet_plot_fun
plot.nnet<-function(mod.in,nid=T,all.out=T,all.in=T,wts.only=F,rel.rsc=5,circle.cex=5,node.labs=T,
line.stag=NULL,cex.val=1,alpha.val=1,circle.col='lightgrey',pos.col='black',neg.col='grey',...){
require(scales)
#gets weights for neural network, output is list
#if rescaled argument is true, weights are returned but rescaled based on abs value
nnet.vals<-function(mod.in,nid,rel.rsc){
library(scales)
@fawda123
fawda123 / catch_fun_v2.r
Last active December 13, 2015 21:38
catch_fun_v2
catch.fun.v2<-function(dows,trace=T,rich.out=F){
require(XML)
strt<-Sys.time()
#create object for output
fish.out<-vector('list',length(dows))
names(fish.out)<-dows