Proszę powiedzieć, czy w przeciągu ostatniego roku firma korzystała z następujących możliwości wsparcia ze strony jednostek samorządu terytorialnego?

Ogólnie

1 oznacza podjęcie współpracy. Procenty przeważone. Wartości w próbie są wyższe - to większe firmy głównie współpracują.

for(i in 1:8){
  print(samorzad[i])
  print(wpct(baza1[,i+86], weight=baza1$waga, na.rm=TRUE))
}
## [1] "ulg i zwolnień od podatków lokalnych"
##          1          2 
## 0.04371574 0.95628426 
## [1] "informacji i pomocy przydatnych w pozyskiwaniu finansowania"
##          1          2 
## 0.07304485 0.92695515 
## [1] "szkoleń finansowanych lub współfinansowanych przez samorząd"
##          1          2 
## 0.07929325 0.92070675 
## [1] "promocji regionu i produktów lokalnych firm"
##          1          2 
## 0.03415252 0.96584748 
## [1] "pomocy w rozwoju infrastruktury potrzebnej do prowadzenia działalności"
##          1          2 
## 0.08031671 0.91968329 
## [1] "korzystania z danych publicznych udostępnianych przez samorząd"
##         1         2 
## 0.1681173 0.8318827 
## [1] "wspólnej realizacji projektów samorządowych z przedsiębiorcami"
##         1         2 
## 0.0387677 0.9612323 
## [1] "innych form współpracy z jednostkami samorządu terytorialnego"
##         1         2 
## 0.1332062 0.8667938

Jakie cechy specyficzne firm powiązane są ze współpracą?

ulg i zwolnień od podatków lokalnych

summary(glm(F1_1==1~branza+wielkosc+warszafka+indyw_kons+inne_firmy+global,baza1,family="binomial"))
## 
## Call:
## glm(formula = F1_1 == 1 ~ branza + wielkosc + warszafka + indyw_kons + 
##     inne_firmy + global, family = "binomial", data = baza1)
## 
## Deviance Residuals: 
##     Min       1Q   Median       3Q      Max  
## -0.8264  -0.5000  -0.2820  -0.1811   2.8456  
## 
## Coefficients:
##                          Estimate Std. Error z value Pr(>|z|)  
## (Intercept)              -1.82138    0.91126  -1.999   0.0456 *
## branzahandel             -0.77123    0.70855  -1.088   0.2764  
## branzausługi             -1.98530    0.80067  -2.480   0.0132 *
## branzaadm,edu,samo        0.30637    0.56547   0.542   0.5880  
## wielkosc10-49 osób       -0.34748    0.62435  -0.557   0.5778  
## wielkosc50 i więcej osób  0.55041    0.55731   0.988   0.3233  
## warszafkaTRUE             0.01425    0.46213   0.031   0.9754  
## indyw_konsTRUE           -0.10106    0.59631  -0.169   0.8654  
## inne_firmyTRUE            0.15255    0.58989   0.259   0.7959  
## globalTRUE               -0.84048    0.54799  -1.534   0.1251  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## (Dispersion parameter for binomial family taken to be 1)
## 
##     Null deviance: 183.19  on 308  degrees of freedom
## Residual deviance: 158.65  on 299  degrees of freedom
##   (12 observations deleted due to missingness)
## AIC: 178.65
## 
## Number of Fisher Scoring iterations: 6
mpal<-brewer.pal(6,"Set2")

ulgi<-gov[gov$time%in%c(1),]
ggplot(ulgi,aes(x=reorder(wartosc,orr),y=f1,fill=cecha))+geom_bar(stat="identity")+theme_bw()+coord_flip()+theme(text=element_text(size=26))+theme(axis.text.y  = element_text(size=16))+scale_y_continuous(labels=percent)+labs(title="Współpraca w zakresie:\n ulg i zwolnień od podatków lokalnych",x="cecha firmy",y="procent firm podejmujących działanie",fill="")+scale_fill_manual(breaks=c("wielkosc","branża","Warszawa","B2B","B2C","obszar")[6:1],values=mpal[6:1],labels=c("wielkość","branża","położenie","B2B","B2C","obszar działania")[6:1])+geom_text(y=ulgi$f1,label=paste(round(ulgi$f1*100,2),"%"))

ggsave("aa1_ulgi.png",width=16,height=10,dpi=300)

informacji i pomocy przydatnych w pozyskiwaniu finansowania

summary(glm(F1_2==1~branza+wielkosc+warszafka+indyw_kons+inne_firmy+global,baza1,family="binomial"))
## 
## Call:
## glm(formula = F1_2 == 1 ~ branza + wielkosc + warszafka + indyw_kons + 
##     inne_firmy + global, family = "binomial", data = baza1)
## 
## Deviance Residuals: 
##     Min       1Q   Median       3Q      Max  
## -1.9140  -0.5824  -0.3138  -0.1541   2.6388  
## 
## Coefficients:
##                          Estimate Std. Error z value Pr(>|z|)    
## (Intercept)              -1.76081    0.72901  -2.415   0.0157 *  
## branzahandel             -1.59138    0.68644  -2.318   0.0204 *  
## branzausługi             -0.58601    0.41673  -1.406   0.1597    
## branzaadm,edu,samo        1.08933    0.46482   2.344   0.0191 *  
## wielkosc10-49 osób       -0.02789    0.52005  -0.054   0.9572    
## wielkosc50 i więcej osób  2.14190    0.44530   4.810 1.51e-06 ***
## warszafkaTRUE            -0.75305    0.35643  -2.113   0.0346 *  
## indyw_konsTRUE            0.18675    0.42626   0.438   0.6613    
## inne_firmyTRUE           -0.07311    0.46387  -0.158   0.8748    
## globalTRUE               -0.24955    0.38090  -0.655   0.5124    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## (Dispersion parameter for binomial family taken to be 1)
## 
##     Null deviance: 345.57  on 318  degrees of freedom
## Residual deviance: 239.01  on 309  degrees of freedom
##   (2 observations deleted due to missingness)
## AIC: 259.01
## 
## Number of Fisher Scoring iterations: 5
ff<-gov[gov$time%in%c(2),]
ggplot(ff,aes(x=reorder(wartosc,orr),y=f1,fill=cecha))+geom_bar(stat="identity")+theme_bw()+coord_flip()+theme(text=element_text(size=26))+theme(axis.text.y  = element_text(size=16))+scale_y_continuous(labels=percent)+labs(title="Współpraca w zakresie:\n informacji i pomocy przydatnych w pozyskiwaniu finansowania",x="cecha firmy",y="procent firm podejmujących działanie",fill="")+scale_fill_manual(breaks=c("wielkosc","branża","Warszawa","B2B","B2C","obszar")[6:1],values=mpal[6:1],labels=c("wielkość","branża","położenie","B2B","B2C","obszar działania")[6:1])+geom_text(y=ff$f1,label=paste(round(ff$f1*100,2),"%"))

ggsave("aa2_info.png",width=16,height=10,dpi=300)

szkoleń finansowanych lub współfinansowanych przez samorząd

summary(glm(F1_3==1~branza+wielkosc+warszafka+indyw_kons+inne_firmy+global,baza1,family="binomial"))
## 
## Call:
## glm(formula = F1_3 == 1 ~ branza + wielkosc + warszafka + indyw_kons + 
##     inne_firmy + global, family = "binomial", data = baza1)
## 
## Deviance Residuals: 
##     Min       1Q   Median       3Q      Max  
## -1.4184  -0.4741  -0.3490  -0.2631   2.8127  
## 
## Coefficients:
##                          Estimate Std. Error z value Pr(>|z|)   
## (Intercept)              -2.54631    0.81049  -3.142  0.00168 **
## branzahandel             -1.16459    0.80899  -1.440  0.14999   
## branzausługi             -0.42753    0.51109  -0.837  0.40287   
## branzaadm,edu,samo        1.61591    0.49573   3.260  0.00112 **
## wielkosc10-49 osób       -0.01356    0.53536  -0.025  0.97979   
## wielkosc50 i więcej osób  1.05039    0.47343   2.219  0.02651 * 
## warszafkaTRUE            -0.02189    0.38900  -0.056  0.95512   
## indyw_konsTRUE            0.13362    0.50021   0.267  0.78938   
## inne_firmyTRUE            0.29699    0.48816   0.608  0.54294   
## globalTRUE               -0.63423    0.44155  -1.436  0.15090   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## (Dispersion parameter for binomial family taken to be 1)
## 
##     Null deviance: 265.76  on 315  degrees of freedom
## Residual deviance: 208.79  on 306  degrees of freedom
##   (5 observations deleted due to missingness)
## AIC: 228.79
## 
## Number of Fisher Scoring iterations: 6
ff<-gov[gov$time%in%c(3),]
ggplot(ff,aes(x=reorder(wartosc,orr),y=f1,fill=cecha))+geom_bar(stat="identity")+theme_bw()+coord_flip()+theme(text=element_text(size=26))+theme(axis.text.y  = element_text(size=16))+scale_y_continuous(labels=percent)+labs(title="Współpraca w zakresie:\n szkoleń finansowanych lub współfinansowanych przez samorząd",x="cecha firmy",y="procent firm podejmujących działanie",fill="")+scale_fill_manual(breaks=c("wielkosc","branża","Warszawa","B2B","B2C","obszar")[6:1],values=mpal[6:1],labels=c("wielkość","branża","położenie","B2B","B2C","obszar działania")[6:1])+geom_text(y=ff$f1,label=paste(round(ff$f1*100,2),"%"))

ggsave("aa3_szkol.png",width=16,height=10,dpi=300)

promocji regionu i produktów lokalnych firm

summary(glm(F1_4==1~branza+wielkosc+warszafka+indyw_kons+inne_firmy+global,baza1,family="binomial"))
## 
## Call:
## glm(formula = F1_4 == 1 ~ branza + wielkosc + warszafka + indyw_kons + 
##     inne_firmy + global, family = "binomial", data = baza1)
## 
## Deviance Residuals: 
##     Min       1Q   Median       3Q      Max  
## -1.5809  -0.4327  -0.2894  -0.1378   3.1166  
## 
## Coefficients:
##                          Estimate Std. Error z value Pr(>|z|)    
## (Intercept)              -4.75813    1.03479  -4.598 4.26e-06 ***
## branzahandel             -0.22114    0.67492  -0.328 0.743173    
## branzausługi              0.02165    0.54828   0.039 0.968496    
## branzaadm,edu,samo        1.41768    0.53612   2.644 0.008186 ** 
## wielkosc10-49 osób        0.43136    0.66687   0.647 0.517735    
## wielkosc50 i więcej osób  2.23263    0.58273   3.831 0.000127 ***
## warszafkaTRUE            -0.49439    0.41551  -1.190 0.234114    
## indyw_konsTRUE            1.47571    0.68187   2.164 0.030449 *  
## inne_firmyTRUE            0.54408    0.52327   1.040 0.298451    
## globalTRUE               -0.35065    0.46182  -0.759 0.447685    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## (Dispersion parameter for binomial family taken to be 1)
## 
##     Null deviance: 263.19  on 318  degrees of freedom
## Residual deviance: 187.56  on 309  degrees of freedom
##   (2 observations deleted due to missingness)
## AIC: 207.56
## 
## Number of Fisher Scoring iterations: 6
ff<-gov[gov$time%in%c(4),]
ggplot(ff,aes(x=reorder(wartosc,orr),y=f1,fill=cecha))+geom_bar(stat="identity")+theme_bw()+coord_flip()+theme(text=element_text(size=26))+theme(axis.text.y  = element_text(size=16))+scale_y_continuous(labels=percent)+labs(title="Współpraca w zakresie:\n promocji regionu i produktów lokalnych firm",x="cecha firmy",y="procent firm podejmujących działanie",fill="")+scale_fill_manual(breaks=c("wielkosc","branża","Warszawa","B2B","B2C","obszar")[6:1],values=mpal[6:1],labels=c("wielkość","branża","położenie","B2B","B2C","obszar działania")[6:1])+geom_text(y=ff$f1,label=paste(round(ff$f1*100,2),"%"))

ggsave("aa4_promo.png",width=16,height=10,dpi=300)

pomocy w rozwoju infrastruktury potrzebnej do prowadzenia działalności

summary(glm(F1_5==1~branza+wielkosc+warszafka+indyw_kons+inne_firmy+global,baza1,family="binomial"))
## 
## Call:
## glm(formula = F1_5 == 1 ~ branza + wielkosc + warszafka + indyw_kons + 
##     inne_firmy + global, family = "binomial", data = baza1)
## 
## Deviance Residuals: 
##     Min       1Q   Median       3Q      Max  
## -1.7862  -0.5110  -0.3495  -0.2004   2.5635  
## 
## Coefficients:
##                          Estimate Std. Error z value Pr(>|z|)    
## (Intercept)              -1.70603    0.75922  -2.247 0.024635 *  
## branzahandel             -1.13016    0.80941  -1.396 0.162634    
## branzausługi              0.12044    0.46568   0.259 0.795909    
## branzaadm,edu,samo        1.72569    0.48233   3.578 0.000346 ***
## wielkosc10-49 osób       -0.14791    0.52040  -0.284 0.776241    
## wielkosc50 i więcej osób  1.27779    0.45207   2.827 0.004706 ** 
## warszafkaTRUE            -0.70621    0.37894  -1.864 0.062370 .  
## indyw_konsTRUE            0.07121    0.47347   0.150 0.880451    
## inne_firmyTRUE           -0.38433    0.45019  -0.854 0.393269    
## globalTRUE               -0.57154    0.41903  -1.364 0.172573    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## (Dispersion parameter for binomial family taken to be 1)
## 
##     Null deviance: 299.47  on 318  degrees of freedom
## Residual deviance: 220.00  on 309  degrees of freedom
##   (2 observations deleted due to missingness)
## AIC: 240
## 
## Number of Fisher Scoring iterations: 6
ff<-gov[gov$time%in%c(5),]
ggplot(ff,aes(x=reorder(wartosc,orr),y=f1,fill=cecha))+geom_bar(stat="identity")+theme_bw()+coord_flip()+theme(text=element_text(size=26))+theme(axis.text.y  = element_text(size=16))+scale_y_continuous(labels=percent)+labs(title="Współpraca w zakresie:\n pomocy w rozwoju infrastruktury\n potrzebnej do prowadzenia działalności",x="cecha firmy",y="procent firm podejmujących działanie",fill="")+scale_fill_manual(breaks=c("wielkosc","branża","Warszawa","B2B","B2C","obszar")[6:1],values=mpal[6:1],labels=c("wielkość","branża","położenie","B2B","B2C","obszar działania")[6:1])+geom_text(y=ff$f1,label=paste(round(ff$f1*100,2),"%"))

ggsave("aa5_infra.png",width=16,height=10,dpi=300)

danych publicznych udostępnianych przez samorząd

summary(glm(F1_6==1~branza+wielkosc+warszafka+indyw_kons+inne_firmy+global,baza1,family="binomial"))
## 
## Call:
## glm(formula = F1_6 == 1 ~ branza + wielkosc + warszafka + indyw_kons + 
##     inne_firmy + global, family = "binomial", data = baza1)
## 
## Deviance Residuals: 
##     Min       1Q   Median       3Q      Max  
## -1.4892  -0.7373  -0.5574   0.7351   2.3070  
## 
## Coefficients:
##                          Estimate Std. Error z value Pr(>|z|)    
## (Intercept)              -1.17571    0.61478  -1.912 0.055823 .  
## branzahandel             -1.56114    0.58198  -2.682 0.007308 ** 
## branzausługi             -0.34381    0.35022  -0.982 0.326262    
## branzaadm,edu,samo        1.41995    0.42249   3.361 0.000777 ***
## wielkosc10-49 osób        0.01957    0.37713   0.052 0.958621    
## wielkosc50 i więcej osób  0.59003    0.36077   1.635 0.101953    
## warszafkaTRUE            -0.46188    0.30018  -1.539 0.123884    
## indyw_konsTRUE           -0.27391    0.34834  -0.786 0.431676    
## inne_firmyTRUE            0.61004    0.42830   1.424 0.154356    
## globalTRUE               -0.38369    0.32706  -1.173 0.240744    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## (Dispersion parameter for binomial family taken to be 1)
## 
##     Null deviance: 369.96  on 315  degrees of freedom
## Residual deviance: 314.50  on 306  degrees of freedom
##   (5 observations deleted due to missingness)
## AIC: 334.5
## 
## Number of Fisher Scoring iterations: 5
ff<-gov[gov$time%in%c(6),]
ggplot(ff,aes(x=reorder(wartosc,orr),y=f1,fill=cecha))+geom_bar(stat="identity")+theme_bw()+coord_flip()+theme(text=element_text(size=26))+theme(axis.text.y  = element_text(size=16))+scale_y_continuous(labels=percent)+labs(title="Współpraca w zakresie:\n danych publicznych udostępnianych przez samorząd",x="cecha firmy",y="procent firm podejmujących działanie",fill="")+scale_fill_manual(breaks=c("wielkosc","branża","Warszawa","B2B","B2C","obszar")[6:1],values=mpal[6:1],labels=c("wielkość","branża","położenie","B2B","B2C","obszar działania")[6:1])+geom_text(y=ff$f1,label=paste(round(ff$f1*100,2),"%"))

ggsave("aa6_dane.png",width=16,height=10,dpi=300)

wspólnej realizacji projektów samorządowych z przedsiębiorcami

summary(glm(F1_7==1~branza+wielkosc+warszafka+indyw_kons+inne_firmy+global,baza1,family="binomial"))
## 
## Call:
## glm(formula = F1_7 == 1 ~ branza + wielkosc + warszafka + indyw_kons + 
##     inne_firmy + global, family = "binomial", data = baza1)
## 
## Deviance Residuals: 
##     Min       1Q   Median       3Q      Max  
## -1.4533  -0.4985  -0.2829  -0.1525   2.9868  
## 
## Coefficients:
##                          Estimate Std. Error z value Pr(>|z|)   
## (Intercept)               -2.7646     0.8895  -3.108  0.00188 **
## branzahandel              -1.8637     1.0752  -1.733  0.08304 . 
## branzausługi              -0.3217     0.5091  -0.632  0.52747   
## branzaadm,edu,samo         1.1557     0.4917   2.350  0.01877 * 
## wielkosc10-49 osób         0.9285     0.6266   1.482  0.13835   
## wielkosc50 i więcej osób   1.8024     0.5881   3.065  0.00218 **
## warszafkaTRUE             -0.4641     0.4067  -1.141  0.25380   
## indyw_konsTRUE             0.4352     0.5461   0.797  0.42545   
## inne_firmyTRUE            -0.1867     0.4663  -0.400  0.68896   
## globalTRUE                -0.7118     0.4716  -1.509  0.13121   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## (Dispersion parameter for binomial family taken to be 1)
## 
##     Null deviance: 263.19  on 318  degrees of freedom
## Residual deviance: 196.03  on 309  degrees of freedom
##   (2 observations deleted due to missingness)
## AIC: 216.03
## 
## Number of Fisher Scoring iterations: 6
ff<-gov[gov$time%in%c(7),]
ggplot(ff,aes(x=reorder(wartosc,orr),y=f1,fill=cecha))+geom_bar(stat="identity")+theme_bw()+coord_flip()+theme(text=element_text(size=26))+theme(axis.text.y  = element_text(size=16))+scale_y_continuous(labels=percent)+labs(title="Współpraca w zakresie:\n wspólnej realizacji projektów samorządowych z przedsiębiorcami",x="cecha firmy",y="procent firm podejmujących działanie",fill="")+scale_fill_manual(breaks=c("wielkosc","branża","Warszawa","B2B","B2C","obszar")[6:1],values=mpal[6:1],labels=c("wielkość","branża","położenie","B2B","B2C","obszar działania")[6:1])+geom_text(y=ff$f1,label=paste(round(ff$f1*100,2),"%"))

ggsave("aa7_projekt.png",width=16,height=10,dpi=300)

innych form współpracy z jednostkami samorządu terytorialnego

summary(glm(F1_8==1~branza+wielkosc+warszafka+indyw_kons+inne_firmy+global,baza1,family="binomial"))
## 
## Call:
## glm(formula = F1_8 == 1 ~ branza + wielkosc + warszafka + indyw_kons + 
##     inne_firmy + global, family = "binomial", data = baza1)
## 
## Deviance Residuals: 
##     Min       1Q   Median       3Q      Max  
## -1.6407  -0.6403  -0.4936  -0.3572   2.4610  
## 
## Coefficients:
##                          Estimate Std. Error z value Pr(>|z|)   
## (Intercept)              -1.57159    0.74662  -2.105  0.03530 * 
## branzahandel             -0.03643    0.58127  -0.063  0.95003   
## branzausługi              0.22235    0.46751   0.476  0.63435   
## branzaadm,edu,samo        1.33060    0.50601   2.630  0.00855 **
## wielkosc10-49 osób        0.22314    0.45458   0.491  0.62351   
## wielkosc50 i więcej osób  0.96422    0.44552   2.164  0.03044 * 
## warszafkaTRUE            -0.56282    0.37118  -1.516  0.12944   
## indyw_konsTRUE            0.32130    0.45625   0.704  0.48130   
## inne_firmyTRUE           -0.45273    0.49440  -0.916  0.35981   
## globalTRUE               -0.35499    0.39330  -0.903  0.36675   
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## (Dispersion parameter for binomial family taken to be 1)
## 
##     Null deviance: 255.65  on 249  degrees of freedom
## Residual deviance: 218.24  on 240  degrees of freedom
##   (71 observations deleted due to missingness)
## AIC: 238.24
## 
## Number of Fisher Scoring iterations: 4
ff<-gov[gov$time%in%c(8),]
ggplot(ff,aes(x=reorder(wartosc,orr),y=f1,fill=cecha))+geom_bar(stat="identity")+theme_bw()+coord_flip()+theme(text=element_text(size=26))+theme(axis.text.y  = element_text(size=16))+scale_y_continuous(labels=percent)+labs(title="Współpraca w zakresie:\n innych form współpracy z jednostkami samorządu terytorialnego",x="cecha firmy",y="procent firm podejmujących działanie",fill="")+scale_fill_manual(breaks=c("wielkosc","branża","Warszawa","B2B","B2C","obszar")[6:1],values=mpal[6:1],labels=c("wielkość","branża","położenie","B2B","B2C","obszar działania")[6:1])+geom_text(y=ff$f1,label=paste(round(ff$f1*100,2),"%"))

ggsave("aa8_inne.png",width=16,height=10,dpi=300)

Jakakolwiek współpraca

ff<-gov[gov$time%in%c(9),]
ggplot(ff,aes(x=reorder(wartosc,orr),y=f1,fill=cecha))+geom_bar(stat="identity")+theme_bw()+coord_flip()+theme(text=element_text(size=26))+theme(axis.text.y  = element_text(size=16))+scale_y_continuous(labels=percent)+labs(title="Współpraca z samorządem: dowolna forma",x="cecha firmy",y="procent firm podejmujących działanie",fill="")+scale_fill_manual(breaks=c("wielkosc","branża","Warszawa","B2B","B2C","obszar")[6:1],values=mpal[6:1],labels=c("wielkość","branża","położenie","B2B","B2C","obszar działania")[6:1])+geom_text(y=ff$f1,label=paste(round(ff$f1*100,2),"%"))

ggsave("aa9_wogole.png",width=16,height=10,dpi=300)

Czy firma w ogóle byłaby zainteresowana współpracą z jednostkami samorządu terytorialnego w przyszłości? 1 - zdecydowanie nie, 5 - zdecydowanie tak

##      TRUE     FALSE 
## 0.3353007 0.6646993
##          1          2          3          4          5 
## 0.14169652 0.09388474 0.39003861 0.16122555 0.21315458
summary(lm(F1B==1~branza+wielkosc+warszafka+indyw_kons+inne_firmy+global,baza1))
## 
## Call:
## lm(formula = F1B == 1 ~ branza + wielkosc + warszafka + indyw_kons + 
##     inne_firmy + global, data = baza1)
## 
## Residuals:
##      Min       1Q   Median       3Q      Max 
## -0.38630 -0.16735 -0.09009 -0.01158  0.94119 
## 
## Coefficients:
##                           Estimate Std. Error t value Pr(>|t|)   
## (Intercept)               0.199216   0.078382   2.542  0.01152 * 
## branzahandel             -0.026762   0.055155  -0.485  0.62787   
## branzausługi             -0.073998   0.046735  -1.583  0.11436   
## branzaadm,edu,samo       -0.138613   0.058944  -2.352  0.01932 * 
## wielkosc10-49 osób       -0.002398   0.044623  -0.054  0.95718   
## wielkosc50 i więcej osób -0.050459   0.046232  -1.091  0.27593   
## warszafkaTRUE             0.081035   0.038227   2.120  0.03482 * 
## indyw_konsTRUE           -0.014348   0.043290  -0.331  0.74053   
## inne_firmyTRUE           -0.096893   0.055369  -1.750  0.08112 . 
## globalTRUE                0.108450   0.040276   2.693  0.00747 **
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Residual standard error: 0.3178 on 310 degrees of freedom
##   (1 observation deleted due to missingness)
## Multiple R-squared:  0.08561,    Adjusted R-squared:  0.05906 
## F-statistic: 3.225 on 9 and 310 DF,  p-value: 0.0009341